使用readxl 套件讀取 Excel 資料 或可以使用右上角的import Dataset 讀取資料
library(readxl)
case_list <- read_excel("~/Desktop/個案清單.xlsx",
col_types = c("numeric", "text", "text",
"text", "date", "date"))
# 可以透過 col_types 更改型態
lab_list <- read_excel("~/Desktop/Lab清單.xlsx",
col_types = c("numeric", "text", "numeric",
"date", "date", "text", "text", "text",
"date", "date", "date", "text",
"text", "text", "text", "text", "numeric",
"numeric", "text", "text", "text",
"text", "numeric", "text"))
symptoms_list <- read_excel("~/Desktop/症狀清單.xlsx")
可以使用 head, View, str 探索
head(case_list)
str(case_list)
## tibble [100 × 6] (S3: tbl_df/tbl/data.frame)
## $ 流水號 : num [1:100] 1 2 3 4 5 6 7 8 9 10 ...
## $ 通報疾病 : chr [1:100] "嚴重特殊傳染性肺炎" "嚴重特殊傳染性肺炎" "嚴重特殊傳染性肺炎" "嚴重特殊傳染性肺炎" ...
## $ 是否境外移入: chr [1:100] NA NA "是" "否" ...
## $ 個案研判 : chr [1:100] "陰性" "陰性" "陽性" "陰性" ...
## $ 發病日期 : POSIXct[1:100], format: "2020-04-25" "2020-04-27" ...
## $ 報告日期 : POSIXct[1:100], format: "2020-04-27" "2020-04-27" ...
colSums(is.na(case_list))
## 流水號 通報疾病 是否境外移入 個案研判 發病日期 報告日期
## 0 0 61 0 0 0
summary(case_list)
## 流水號 通報疾病 是否境外移入 個案研判
## Min. : 1.00 Length:100 Length:100 Length:100
## 1st Qu.: 25.75 Class :character Class :character Class :character
## Median : 50.50 Mode :character Mode :character Mode :character
## Mean : 50.50
## 3rd Qu.: 75.25
## Max. :100.00
## 發病日期 報告日期
## Min. :2020-01-14 00:00:00 Min. :2020-02-02 00:00:00
## 1st Qu.:2020-02-28 18:00:00 1st Qu.:2020-03-01 00:00:00
## Median :2020-03-29 00:00:00 Median :2020-04-03 00:00:00
## Mean :2020-03-31 17:31:12 Mean :2020-04-04 14:52:48
## 3rd Qu.:2020-04-21 06:00:00 3rd Qu.:2020-04-27 00:00:00
## Max. :2020-06-21 00:00:00 Max. :2020-06-21 00:00:00
table(case_list$是否境外移入, useNA = "ifany")
##
## 否 是 <NA>
## 11 28 61
?table
## Help on topic 'table' was found in the following packages:
##
## Package Library
## vctrs /Library/Frameworks/R.framework/Versions/4.0/Resources/library
## base /Library/Frameworks/R.framework/Resources/library
##
##
## Using the first match ...
head(lab_list)
head(symptoms_list)
dplyr 允許使用者用類似SQL的語法 搭配 %>% 操作 data.frame
# install.packages('dplyr')
library(dplyr)
##
## Attaching package: 'dplyr'
## The following objects are masked from 'package:stats':
##
## filter, lag
## The following objects are masked from 'package:base':
##
## intersect, setdiff, setequal, union
a <- data.frame(a= c(1,2,3), b = c(2,3,4))
a
# %>% : magrittr
a %>%
select(a, b) %>%
mutate(c = a + b)
原本邏輯
=IF(DAYS("2019/11/1",F3)>=0,0,1)
R 語言邏輯
case_list %>%
head()
# if (a > 3){
# return(1)
# }else{
# return(0)
# }
a <- 2
ifelse(a > 3, 1, 0)
## [1] 0
# backticks `
case_list %>%
mutate(`2019年11月後` = ifelse(`報告日期` >= '2019-11-01',1,0) ) %>%
head()
case_list <- case_list %>%
mutate(`2019年11月後` = ifelse(`報告日期` >= '2019-11-01',1,0) )
case_list %>%
head()
R語言邏輯
paste('Hello', 'World')
## [1] "Hello World"
paste('Hello', 'World', sep = '')
## [1] "HelloWorld"
paste0('Hello', 'World')
## [1] "HelloWorld"
paste('Hello','$', 'World')
## [1] "Hello $ World"
paste0(1, '')
## [1] "1"
paste0(1, NA)
## [1] "1NA"
paste0(1, NULL)
## [1] "1"
?paste
case_list %>%
mutate(`key值` = paste0(`流水號`, `通報疾病`)) %>%
head()
case_list <- case_list %>%
mutate(`key值` = paste0(`流水號`, `通報疾病`))
case_list %>%
head()
補強R base中原本的函數式編程風格
library(purrr)
emoticons_1 <- function(x) {
if (x == "happy") {
":)"
} else if (x == "sad") {
":("
} else {
"Feeling too complex for emoticons"
}
}
emoticons_1('other')
## [1] "Feeling too complex for emoticons"
df <-
tibble(
feeling = c("sad", "compunctious", "happy")
)
df
sapply(df$feeling, emoticons_1)
## sad compunctious
## ":(" "Feeling too complex for emoticons"
## happy
## ":)"
df %>%
mutate(emoticon = emoticons_1(`feeling`))
## Warning in if (x == "happy") {: the condition has length > 1 and only the first
## element will be used
## Warning in if (x == "sad") {: the condition has length > 1 and only the first
## element will be used
#install.packages('purrr')
library(purrr)
df %>%
mutate(emoticon = map_chr(feeling, emoticons_1))
原本邏輯
=IF(
AND(
TYPE(VLOOKUP(I2,old!$A:$A,1,FALSE))=16,
OR(
個案清單!B2="嚴重特殊傳染性肺炎",
個案清單!B2="疑似新冠病毒感染送驗入口",
個案清單!B2="居家檢疫有症狀者送驗入口"
)
),1,0
)
R語言邏輯
oldcases <- c('1嚴重特殊傳染性肺炎','2嚴重特殊傳染性肺炎',
'3嚴重特殊傳染性肺炎','4嚴重特殊傳染性肺炎','5嚴重特殊傳染性肺炎',
'6嚴重特殊傳染性肺炎','7嚴重特殊傳染性肺炎','8嚴重特殊傳染性肺炎',
'9嚴重特殊傳染性肺炎','10嚴重特殊傳染性肺炎','11嚴重特殊傳染性肺炎',
'12嚴重特殊傳染性肺炎','13嚴重特殊傳染性肺炎','14嚴重特殊傳染性肺炎',
'15嚴重特殊傳染性肺炎')
newcase <- function(I2, B2){
I2_cond <- ! (I2 %in% oldcases)
B2_cond <- B2 %in% c('嚴重特殊傳染性肺炎', '疑似新冠病毒感染送驗入口', '居家檢疫有症狀者送驗入口')
return(as.integer(B2_cond && I2_cond))
}
newcase('16嚴重特殊傳染性肺炎', '嚴重特殊傳染性肺炎')
## [1] 1
newcase('16QOO', 'QOO')
## [1] 0
library(purrr)
case_list %>%
mutate(`新增通報-疾病限制` = map2_chr(`key值`, `通報疾病`, newcase)) %>%
head(20)
case_list <- case_list %>%
mutate(`新增通報-疾病限制` = map2_chr(`key值`, `通報疾病`, newcase))
case_list %>%
head()
case_list %>%
mutate(d = pmap_int( list(`key值`, `通報疾病`), newcase))%>%
select('d')
library(readxl)
library(dplyr)
library(purrr)
newcase <- function(I2, B2){
I2_cond <- ! (I2 %in% oldcases)
B2_cond <- B2 %in% c('嚴重特殊傳染性肺炎', '疑似新冠病毒感染送驗入口', '居家檢疫有症狀者送驗入口')
return(as.integer(B2_cond && I2_cond))
}
oldcases <- c('1嚴重特殊傳染性肺炎','2嚴重特殊傳染性肺炎',
'3嚴重特殊傳染性肺炎','4嚴重特殊傳染性肺炎','5嚴重特殊傳染性肺炎',
'6嚴重特殊傳染性肺炎','7嚴重特殊傳染性肺炎','8嚴重特殊傳染性肺炎',
'9嚴重特殊傳染性肺炎','10嚴重特殊傳染性肺炎','11嚴重特殊傳染性肺炎',
'12嚴重特殊傳染性肺炎','13嚴重特殊傳染性肺炎','14嚴重特殊傳染性肺炎',
'15嚴重特殊傳染性肺炎')
case_list <- read_excel("~/Desktop/個案清單.xlsx",
col_types = c("numeric", "text", "text",
"text", "date", "date"))
case_list %>%
mutate(`2019年11月後` = ifelse(`報告日期` >= '2019-11-01',1,0) ) %>%
mutate(`key值` = paste0(`流水號`, `通報疾病`)) %>%
mutate(`新增通報-疾病限制` = pmap_int( list(`key值`, `通報疾病`), newcase)) %>%
head()
case_list <- case_list %>%
mutate(`2019年11月後` = ifelse(`報告日期` >= '2019-11-01',1,0) ) %>%
mutate(`key值` = paste0(`流水號`, `通報疾病`)) %>%
mutate(`新增通報-疾病限制` = pmap_int( list(`key值`, `通報疾病`), newcase))
FALSE && TRUE
## [1] FALSE
FALSE || TRUE
## [1] TRUE
! FALSE
## [1] TRUE
! TRUE
## [1] FALSE
a <- data.frame(a = c(1,2,3))
a%>%head(2)%>%sum()
## [1] 3
a %>%
head(2) %>%
sum()
## [1] 3
oldcases_list <- data.frame(key值 = c('1嚴重特殊傳染性肺炎','2嚴重特殊傳染性肺炎',
'3嚴重特殊傳染性肺炎','4嚴重特殊傳染性肺炎','5嚴重特殊傳染性肺炎',
'6嚴重特殊傳染性肺炎','7嚴重特殊傳染性肺炎','8嚴重特殊傳染性肺炎',
'9嚴重特殊傳染性肺炎','10嚴重特殊傳染性肺炎','11嚴重特殊傳染性肺炎',
'12嚴重特殊傳染性肺炎','13嚴重特殊傳染性肺炎','14嚴重特殊傳染性肺炎',
'15嚴重特殊傳染性肺炎') )
case_list %>%
left_join(oldcases_list, by = c("key值"),keep=TRUE) %>%
filter(is.na(`key值.y`))
原邏輯
=IF(
A5="","",
IF(
TYPE(SEARCH("咽",M5))=1,"咽喉拭子",
IF(
TYPE(SEARCH("痰",M5))=1,"痰",
IF(
TYPE(SEARCH("血",M5))=1,"",
IF(M5="","未採檢","其他")
)
)
)
)
R語言邏輯
lab_sample_etl <- function(A,M){
if(A == ''){
''
}
if( grepl('咽', M) ){
'咽喉拭子'
}else if( grepl('痰', M) ){
'痰'
}else if( grepl('血', M) ){
''
}else if(M == ""){
'未採檢'
}else{
'其他'
}
}
grepl('咽', '咽喉')
## [1] TRUE
grepl('H\\dN\\d','H3N1')
## [1] TRUE
grepl('H\\dN\\d','H5N2')
## [1] TRUE
grepl('H\\dN\\d','R2D2')
## [1] FALSE
table(is.na(lab_list$流水號))
##
## FALSE
## 839
table(is.na(lab_list$檢體種類))
##
## FALSE TRUE
## 834 5
lab_list$檢體種類[is.na(lab_list$檢體種類)] <- ''
lab_list %>%
mutate(`檢體種例` = pmap_chr(list(`流水號`,`檢體種類`), lab_sample_etl))
# install.packages('tidyr')
library(tidyr)
?replace_na
lab_list <- lab_list %>%
replace_na(list(`流水號` = '', `檢體種類` = '')) %>%
mutate(`檢體種例` = pmap_chr(list(`流水號`,`檢體種類`), lab_sample_etl))
lab_list %>%
head(40) %>%
tail(10) %>%
select(`檢體種類`, `檢體種例`)
df <- data.frame(
a = c(50, 60, 70),
b = c(10, 90, 40),
c = c(1, 105, 2000)
)
df
df %>%
mutate(d = pmap_dbl(list(a, b, c), min))
原邏輯
IF(
OR(
F2="嚴重特殊傳染性肺炎",
F2="疑似新冠病毒感染送驗入口",
F2="居家檢疫有症狀者送驗入口"
),
IF(
OR(
TYPE(SEARCH("陽性",N2))=1,
TYPE(SEARCH("陽性2019-nCoV",S2&U2))=1
),"2019nCoV",
IF(
TYPE(SEARCH("swH1",W2))=1,"H1N1",
IF(
TYPE(SEARCH("H3",W2))=1,"H3N2",
IF(
TYPE(SEARCH("B型",V2))=1,"B型",
IF(TYPE(SEARCH("A型",V2))=1,"A未分型",
IF(
OR(N2="檢體保留",Y2=""),"檢體保留",
IF(
M2="","未採檢",
IF(D2&E2="","未收件",
IF(OR(N2="尚無研判結果",N2=""),"檢驗中",
IF(N2="陰性","陰性","其他")))
)
)
)
)
)
)
)
)
R語言邏輯
lab_result_etl <- function(F2, N, S, U, W, V, Y, M,D,E){
if(F2 %in% c("嚴重特殊傳染性肺炎", "疑似新冠病毒感染送驗入口", "居家檢疫有症狀者送驗入口")){
#print(paste(F2,N))
if (grepl('陽性',N) | grepl('陽性2019-nCoV',paste0(S,U)) )
'2019nCoV'
else if(grepl('swH1',W))
'H1N1'
else if(grepl('H3', W))
'H3N2'
else if(grepl('B型', V))
'B型'
else if(grepl('A型', V))
'A未分型'
else if((N=="檢體保留") | (Y=="") )
"檢體保留"
else if(M== '')
"未採檢"
else if((paste0(D,E) == '') || (is.na(D) && is.na(E)) )
'未收件'
else if( (N == "尚無研判結果") || (N=="") )
'檢驗中'
else if(N == '陰性')
'陰性'
else
'其他'
}
}
lab_list <- lab_list %>%
replace_na(list(`通報疾病` ='',`綜合檢驗結果`='',`病原體檢驗結果`='',
`病原體大類`='',`病原體次分型`='',`病原體細類`='',
`檢體種例`='',`檢體種類`='')) %>%
mutate(`檢驗結果` = pmap_chr(list(`通報疾病`,`綜合檢驗結果`,`病原體檢驗結果`,
`病原體大類`,`病原體次分型`,`病原體細類`,
`檢體種例`,`檢體種類`,`單一窗口檢體收件日期`,
`檢驗結果通知日期`), lab_result_etl))
lab_list %>% head()
library(tidyr)
library(readxl)
library(dplyr)
library(purrr)
# 檢體種例
lab_sample_etl <- function(A,M){
if(A == ''){
''
}
if( grepl('咽', M) ){
'咽喉拭子'
}else if( grepl('痰', M) ){
'痰'
}else if( grepl('血', M) ){
''
}else if(M == ""){
'未採檢'
}else{
'其他'
}
}
#檢驗結果
lab_result_etl <- function(F2, N, S, U, W, V, Y, M,D,E){
if(F2 %in% c("嚴重特殊傳染性肺炎", "疑似新冠病毒感染送驗入口", "居家檢疫有症狀者送驗入口")){
#print(paste(F2,N))
if (grepl('陽性',N) | grepl('陽性2019-nCoV',paste0(S,U)) )
'2019nCoV'
else if(grepl('swH1',W))
'H1N1'
else if(grepl('H3', W))
'H3N2'
else if(grepl('B型', V))
'B型'
else if(grepl('A型', V))
'A未分型'
else if((N=="檢體保留") | (Y=="") )
"檢體保留"
else if(M== '')
"未採檢"
else if((paste0(D,E) == '') || (is.na(D) && is.na(E)) )
'未收件'
else if( (N == "尚無研判結果") || (N=="") )
'檢驗中'
else if(N == '陰性')
'陰性'
else
'其他'
}
}
lab_list <- read_excel("~/Desktop/Lab清單.xlsx",
col_types = c("numeric", "text", "numeric",
"date", "date", "text", "text", "text",
"date", "date", "date", "text",
"text", "text", "text", "text", "numeric",
"numeric", "text", "text", "text",
"text", "numeric", "text"))
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A2 / R2C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A3 / R3C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A4 / R4C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A5 / R5C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A6 / R6C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A7 / R7C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A8 / R8C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A9 / R9C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A10 / R10C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A11 / R11C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A12 / R12C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A13 / R13C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A14 / R14C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A15 / R15C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A16 / R16C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A17 / R17C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A18 / R18C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A19 / R19C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A20 / R20C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A21 / R21C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A22 / R22C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A23 / R23C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A24 / R24C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A25 / R25C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A26 / R26C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A27 / R27C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A28 / R28C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A29 / R29C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A30 / R30C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A31 / R31C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A32 / R32C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A33 / R33C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A34 / R34C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A35 / R35C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A36 / R36C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A37 / R37C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A38 / R38C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A39 / R39C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A40 / R40C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A41 / R41C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A42 / R42C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A43 / R43C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A44 / R44C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A45 / R45C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A46 / R46C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A47 / R47C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A48 / R48C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A49 / R49C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A50 / R50C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A51 / R51C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A52 / R52C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A53 / R53C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A54 / R54C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A55 / R55C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A56 / R56C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A57 / R57C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A58 / R58C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A59 / R59C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A60 / R60C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A61 / R61C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A62 / R62C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A63 / R63C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A64 / R64C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A65 / R65C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A66 / R66C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A67 / R67C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A68 / R68C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A69 / R69C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A70 / R70C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A71 / R71C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A72 / R72C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A73 / R73C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A74 / R74C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A75 / R75C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A76 / R76C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A77 / R77C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A78 / R78C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A79 / R79C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A80 / R80C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A81 / R81C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A82 / R82C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A83 / R83C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A84 / R84C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A85 / R85C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A86 / R86C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A87 / R87C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A88 / R88C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A89 / R89C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A90 / R90C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A91 / R91C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A92 / R92C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A93 / R93C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A94 / R94C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A95 / R95C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A96 / R96C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A97 / R97C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A98 / R98C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A99 / R99C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A100 / R100C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A101 / R101C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A102 / R102C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A103 / R103C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A104 / R104C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A105 / R105C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A106 / R106C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A107 / R107C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A108 / R108C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A109 / R109C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A110 / R110C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A111 / R111C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A112 / R112C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A113 / R113C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A114 / R114C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A115 / R115C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A116 / R116C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A117 / R117C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A118 / R118C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A119 / R119C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A120 / R120C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A121 / R121C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A122 / R122C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A123 / R123C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A124 / R124C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A125 / R125C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A126 / R126C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A127 / R127C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A128 / R128C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A129 / R129C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A130 / R130C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A131 / R131C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A132 / R132C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A133 / R133C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A134 / R134C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A135 / R135C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A136 / R136C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A137 / R137C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A138 / R138C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A139 / R139C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A140 / R140C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A141 / R141C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A142 / R142C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A143 / R143C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A144 / R144C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A145 / R145C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A146 / R146C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A147 / R147C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A148 / R148C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A149 / R149C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A150 / R150C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A151 / R151C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A152 / R152C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A153 / R153C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A154 / R154C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A155 / R155C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A156 / R156C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A157 / R157C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A158 / R158C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A159 / R159C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A160 / R160C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A161 / R161C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A162 / R162C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A163 / R163C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A164 / R164C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A165 / R165C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A166 / R166C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A167 / R167C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A168 / R168C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A169 / R169C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A170 / R170C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A171 / R171C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A172 / R172C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A173 / R173C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A174 / R174C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A175 / R175C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A176 / R176C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A177 / R177C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A178 / R178C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A179 / R179C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A180 / R180C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A181 / R181C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A182 / R182C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A183 / R183C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A184 / R184C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A185 / R185C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A186 / R186C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A187 / R187C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A188 / R188C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A189 / R189C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A190 / R190C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A191 / R191C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A192 / R192C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A193 / R193C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A194 / R194C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A195 / R195C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A196 / R196C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A197 / R197C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A198 / R198C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A199 / R199C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A200 / R200C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A201 / R201C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A202 / R202C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A203 / R203C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A204 / R204C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A205 / R205C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A206 / R206C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A207 / R207C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A208 / R208C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A209 / R209C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A210 / R210C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A211 / R211C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A212 / R212C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A213 / R213C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A214 / R214C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A215 / R215C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A216 / R216C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A217 / R217C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A218 / R218C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A219 / R219C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A220 / R220C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A221 / R221C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A222 / R222C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A223 / R223C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A224 / R224C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A225 / R225C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A226 / R226C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A227 / R227C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A228 / R228C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A229 / R229C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A230 / R230C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A231 / R231C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A232 / R232C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A233 / R233C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A234 / R234C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A235 / R235C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A236 / R236C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A237 / R237C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A238 / R238C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A239 / R239C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A240 / R240C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A241 / R241C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A242 / R242C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A243 / R243C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A244 / R244C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A245 / R245C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A246 / R246C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A247 / R247C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A248 / R248C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A249 / R249C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A250 / R250C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A251 / R251C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A252 / R252C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A253 / R253C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A254 / R254C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A255 / R255C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A256 / R256C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A257 / R257C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A258 / R258C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A259 / R259C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A260 / R260C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A261 / R261C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A262 / R262C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A263 / R263C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A264 / R264C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A265 / R265C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A266 / R266C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A267 / R267C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A268 / R268C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A269 / R269C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A270 / R270C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A271 / R271C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A272 / R272C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A273 / R273C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A274 / R274C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A275 / R275C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A276 / R276C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A277 / R277C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A278 / R278C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A279 / R279C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A280 / R280C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A281 / R281C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A282 / R282C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A283 / R283C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A284 / R284C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A285 / R285C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A286 / R286C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A287 / R287C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A288 / R288C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A289 / R289C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A290 / R290C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A291 / R291C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A292 / R292C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A293 / R293C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A294 / R294C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A295 / R295C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A296 / R296C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A297 / R297C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A298 / R298C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A299 / R299C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A300 / R300C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A301 / R301C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A302 / R302C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A303 / R303C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A304 / R304C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A305 / R305C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A306 / R306C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A307 / R307C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A308 / R308C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A309 / R309C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A310 / R310C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A311 / R311C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A312 / R312C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A313 / R313C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A314 / R314C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A315 / R315C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A316 / R316C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A317 / R317C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A318 / R318C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A319 / R319C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A320 / R320C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A321 / R321C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A322 / R322C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A323 / R323C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A324 / R324C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A325 / R325C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A326 / R326C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A327 / R327C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A328 / R328C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A329 / R329C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A330 / R330C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A331 / R331C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A332 / R332C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A333 / R333C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A334 / R334C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A335 / R335C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A336 / R336C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A337 / R337C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A338 / R338C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A339 / R339C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A340 / R340C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A341 / R341C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A342 / R342C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A343 / R343C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A344 / R344C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A345 / R345C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A346 / R346C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A347 / R347C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A348 / R348C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A349 / R349C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A350 / R350C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A351 / R351C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A352 / R352C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A353 / R353C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A354 / R354C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A355 / R355C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A356 / R356C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A357 / R357C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A358 / R358C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A359 / R359C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A360 / R360C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A361 / R361C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A362 / R362C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A363 / R363C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A364 / R364C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A365 / R365C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A366 / R366C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A367 / R367C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A368 / R368C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A369 / R369C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A370 / R370C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A371 / R371C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A372 / R372C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A373 / R373C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A374 / R374C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A375 / R375C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A376 / R376C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A377 / R377C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A378 / R378C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A379 / R379C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A380 / R380C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A381 / R381C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A382 / R382C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A383 / R383C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A384 / R384C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A385 / R385C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A386 / R386C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A387 / R387C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A388 / R388C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A389 / R389C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A390 / R390C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A391 / R391C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A392 / R392C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A393 / R393C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A394 / R394C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A395 / R395C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A396 / R396C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A397 / R397C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A398 / R398C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A399 / R399C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A400 / R400C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A401 / R401C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A402 / R402C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A403 / R403C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A404 / R404C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A405 / R405C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A406 / R406C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A407 / R407C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A408 / R408C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A409 / R409C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A410 / R410C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A411 / R411C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A412 / R412C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A413 / R413C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A414 / R414C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A415 / R415C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A416 / R416C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A417 / R417C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A418 / R418C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A419 / R419C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A420 / R420C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A421 / R421C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A422 / R422C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A423 / R423C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A424 / R424C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A425 / R425C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A426 / R426C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A427 / R427C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A428 / R428C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A429 / R429C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A430 / R430C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A431 / R431C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A432 / R432C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A433 / R433C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A434 / R434C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A435 / R435C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A436 / R436C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A437 / R437C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A438 / R438C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A439 / R439C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A440 / R440C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A441 / R441C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A442 / R442C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A443 / R443C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A444 / R444C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A445 / R445C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A446 / R446C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A447 / R447C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A448 / R448C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A449 / R449C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A450 / R450C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A451 / R451C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A452 / R452C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A453 / R453C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A454 / R454C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A455 / R455C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A456 / R456C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A457 / R457C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A458 / R458C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A459 / R459C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A460 / R460C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A461 / R461C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A462 / R462C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A463 / R463C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A464 / R464C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A465 / R465C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A466 / R466C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A467 / R467C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A468 / R468C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A469 / R469C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A470 / R470C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A471 / R471C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A472 / R472C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A473 / R473C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A474 / R474C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A475 / R475C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A476 / R476C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A477 / R477C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A478 / R478C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A479 / R479C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A480 / R480C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A481 / R481C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A482 / R482C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A483 / R483C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A484 / R484C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A485 / R485C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A486 / R486C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A487 / R487C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A488 / R488C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A489 / R489C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A490 / R490C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A491 / R491C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A492 / R492C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A493 / R493C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A494 / R494C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A495 / R495C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A496 / R496C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A497 / R497C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A498 / R498C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A499 / R499C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A500 / R500C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A501 / R501C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A502 / R502C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A503 / R503C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A504 / R504C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A505 / R505C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A506 / R506C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A507 / R507C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A508 / R508C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A509 / R509C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A510 / R510C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A511 / R511C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A512 / R512C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A513 / R513C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A514 / R514C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A515 / R515C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A516 / R516C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A517 / R517C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A518 / R518C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A519 / R519C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A520 / R520C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A521 / R521C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A522 / R522C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A523 / R523C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A524 / R524C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A525 / R525C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A526 / R526C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A527 / R527C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A528 / R528C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A529 / R529C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A530 / R530C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A531 / R531C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A532 / R532C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A533 / R533C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A534 / R534C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A535 / R535C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A536 / R536C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A537 / R537C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A538 / R538C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A539 / R539C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A540 / R540C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A541 / R541C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A542 / R542C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A543 / R543C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A544 / R544C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A545 / R545C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A546 / R546C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A547 / R547C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A548 / R548C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A549 / R549C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A550 / R550C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A551 / R551C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A552 / R552C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A553 / R553C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A554 / R554C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A555 / R555C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A556 / R556C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A557 / R557C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A558 / R558C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A559 / R559C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A560 / R560C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A561 / R561C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A562 / R562C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A563 / R563C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A564 / R564C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A565 / R565C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A566 / R566C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A567 / R567C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A568 / R568C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A569 / R569C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A570 / R570C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A571 / R571C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A572 / R572C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A573 / R573C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A574 / R574C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A575 / R575C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A576 / R576C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A577 / R577C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A578 / R578C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A579 / R579C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A580 / R580C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A581 / R581C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A582 / R582C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A583 / R583C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A584 / R584C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A585 / R585C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A586 / R586C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A587 / R587C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A588 / R588C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A589 / R589C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A590 / R590C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A591 / R591C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A592 / R592C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A593 / R593C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A594 / R594C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A595 / R595C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A596 / R596C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A597 / R597C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A598 / R598C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A599 / R599C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A600 / R600C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A601 / R601C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A602 / R602C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A603 / R603C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A604 / R604C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A605 / R605C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A606 / R606C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A607 / R607C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A608 / R608C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A609 / R609C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A610 / R610C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A611 / R611C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A612 / R612C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A613 / R613C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A614 / R614C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A615 / R615C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A616 / R616C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A617 / R617C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A618 / R618C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A619 / R619C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A620 / R620C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A621 / R621C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A622 / R622C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A623 / R623C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A624 / R624C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A625 / R625C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A626 / R626C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A627 / R627C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A628 / R628C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A629 / R629C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A630 / R630C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A631 / R631C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A632 / R632C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A633 / R633C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A634 / R634C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A635 / R635C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A636 / R636C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A637 / R637C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A638 / R638C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A639 / R639C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A640 / R640C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A641 / R641C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A642 / R642C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A643 / R643C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A644 / R644C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A645 / R645C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A646 / R646C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A647 / R647C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A648 / R648C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A649 / R649C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A650 / R650C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A651 / R651C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A652 / R652C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A653 / R653C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A654 / R654C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A655 / R655C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A656 / R656C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A657 / R657C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A658 / R658C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A659 / R659C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A660 / R660C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A661 / R661C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A662 / R662C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A663 / R663C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A664 / R664C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A665 / R665C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A666 / R666C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A667 / R667C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A668 / R668C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A669 / R669C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A670 / R670C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A671 / R671C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A672 / R672C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A673 / R673C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A674 / R674C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A675 / R675C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A676 / R676C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A677 / R677C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A678 / R678C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A679 / R679C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A680 / R680C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A681 / R681C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A682 / R682C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A683 / R683C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A684 / R684C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A685 / R685C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A686 / R686C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A687 / R687C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A688 / R688C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A689 / R689C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A690 / R690C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A691 / R691C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A692 / R692C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A693 / R693C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A694 / R694C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A695 / R695C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A696 / R696C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A697 / R697C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A698 / R698C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A699 / R699C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A700 / R700C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A701 / R701C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A702 / R702C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A703 / R703C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A704 / R704C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A705 / R705C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A706 / R706C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A707 / R707C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A708 / R708C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A709 / R709C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A710 / R710C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A711 / R711C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A712 / R712C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A713 / R713C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A714 / R714C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A715 / R715C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A716 / R716C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A717 / R717C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A718 / R718C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A719 / R719C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A720 / R720C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A721 / R721C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A722 / R722C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A723 / R723C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A724 / R724C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A725 / R725C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A726 / R726C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A727 / R727C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A728 / R728C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A729 / R729C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A730 / R730C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A731 / R731C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A732 / R732C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A733 / R733C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A734 / R734C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A735 / R735C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A736 / R736C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A737 / R737C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A738 / R738C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A739 / R739C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A740 / R740C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A741 / R741C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A742 / R742C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A743 / R743C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A744 / R744C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A745 / R745C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A746 / R746C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A747 / R747C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A748 / R748C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A749 / R749C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A750 / R750C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A751 / R751C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A752 / R752C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A753 / R753C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A754 / R754C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A755 / R755C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A756 / R756C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A757 / R757C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A758 / R758C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A759 / R759C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A760 / R760C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A761 / R761C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A762 / R762C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A763 / R763C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A764 / R764C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A765 / R765C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A766 / R766C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A767 / R767C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A768 / R768C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A769 / R769C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A770 / R770C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A771 / R771C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A772 / R772C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A773 / R773C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A774 / R774C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A775 / R775C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A776 / R776C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A777 / R777C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A778 / R778C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A779 / R779C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A780 / R780C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A781 / R781C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A782 / R782C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A783 / R783C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A784 / R784C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A785 / R785C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A786 / R786C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A787 / R787C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A788 / R788C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A789 / R789C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A790 / R790C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A791 / R791C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A792 / R792C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A793 / R793C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A794 / R794C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A795 / R795C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A796 / R796C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A797 / R797C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A798 / R798C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A799 / R799C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A800 / R800C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A801 / R801C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A802 / R802C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A803 / R803C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A804 / R804C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A805 / R805C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A806 / R806C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A807 / R807C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A808 / R808C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A809 / R809C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A810 / R810C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A811 / R811C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A812 / R812C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A813 / R813C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A814 / R814C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A815 / R815C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A816 / R816C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A817 / R817C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A818 / R818C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A819 / R819C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A820 / R820C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A821 / R821C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A822 / R822C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A823 / R823C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A824 / R824C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A825 / R825C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A826 / R826C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A827 / R827C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A828 / R828C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A829 / R829C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A830 / R830C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A831 / R831C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A832 / R832C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A833 / R833C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A834 / R834C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A835 / R835C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A836 / R836C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A837 / R837C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A838 / R838C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A839 / R839C1: got a date
## Warning in read_fun(path = enc2native(normalizePath(path)), sheet_i = sheet, :
## Expecting numeric in A840 / R840C1: got a date
## 資料前處理
lab_list$檢體種類[is.na(lab_list$檢體種類)] <- ''
## 資料轉換
lab_list <- lab_list %>%
replace_na(list(`流水號` = '', `檢體種類` = '')) %>%
mutate(`檢體種例` = pmap_chr(list(`流水號`,`檢體種類`), lab_sample_etl))
lab_list <- lab_list %>%
replace_na(list(`通報疾病` ='',`綜合檢驗結果`='',`病原體檢驗結果`='',
`病原體大類`='',`病原體次分型`='',`病原體細類`='',
`檢體種例`='',`檢體種類`='')) %>%
mutate(`檢驗結果` = pmap_chr(list(`通報疾病`,`綜合檢驗結果`,`病原體檢驗結果`,
`病原體大類`,`病原體次分型`,`病原體細類`,
`檢體種例`,`檢體種類`,`單一窗口檢體收件日期`,
`檢驗結果通知日期`), lab_result_etl))
lab_list %>%
select(檢驗結果) %>%
write.csv('~/Desktop/test.csv',row.names = FALSE, quote=FALSE)
df <- data.frame(a = c('A', 'B', 'C', 'A'), b = c('V1', 'V2','V1', 'V2'), v = c(2,3,4,5))
df
library(reshape2)
##
## Attaching package: 'reshape2'
## The following object is masked from 'package:tidyr':
##
## smiths
dcast(df, a ~ b, value.var="v", fun.aggregate = sum)
symptoms_list %>%
head()
library(reshape2)
symptoms_pivot <- dcast(symptoms_list, `管制署收到日期(西元-yyyymmdd)` ~ `綜合檢驗結果`, value.var="編號", fun.aggregate = length)
symptoms_pivot
#rowSums(symptoms_pivot)
#df[列,欄]
symptoms_pivot$總計 <- rowSums(symptoms_pivot[ ,-1])
symptoms_pivot %>%
tail()
#欄總計
colSums(symptoms_pivot[,-1])
## 尚無研判結果 檢體保留 無效檢體 陰性 陽性 總計
## 4 1 10 5 10 30
lab_list %>%
head()
lab_list$流水號 <- strtoi(lab_list$流水號)
#as.integer(lab_list$流水號)
library(reshape2)
lab_pivot <- dcast(lab_list, `流水號` ~`檢體種例` + `檢驗結果` , value.var="流水號", fun.aggregate = length)
#names(lab_pivot)
lab_pivot$總計 <- rowSums(lab_pivot[,-1])
lab_pivot %>%
head()
colSums(lab_pivot[,-1])
## _檢體保留 其他_陰性 咽喉拭子_2019nCoV 咽喉拭子_A未分型
## 36 1 66 1
## 咽喉拭子_B型 咽喉拭子_其他 咽喉拭子_未收件 咽喉拭子_檢驗中
## 1 4 5 5
## 咽喉拭子_陰性 未採檢_未採檢 痰_2019nCoV 痰_陰性
## 629 5 39 47
## 總計
## 839
overall_judge <- data.frame(編號= lab_pivot$流水號)
overall_judge %>% tail()
=IF(
OR(AX4=0,AX4="總計"),"",
IF(AF4="","","未收件")&
IF(AG4="","","未採檢")&
IF(AH4="","","其他")&
IF(AI4="","","陰性")&
IF(AJ4="","","檢驗中")&
IF(AK4="","","檢體保留")&
IF(AE4="","","B型")&
IF(AD4="","","A未分型")&
IF(AC4="","","2019nCoV")
)
df <- data.frame(a =c(5,5,5), b =c(3,3,3), c = c(8,8,8))
df
apply(df, MARGIN = 1, function(x){sum(x)} )
## [1] 16 16 16
apply(df, MARGIN = 2, function(x){sum(x)} )
## a b c
## 15 9 24
throat <- lab_pivot[ , grepl( "咽喉拭子_" , names( lab_pivot ) ) ]
#throat
throat[1,] > 0
## 咽喉拭子_2019nCoV 咽喉拭子_A未分型 咽喉拭子_B型 咽喉拭子_其他 咽喉拭子_未收件
## 1 FALSE FALSE FALSE FALSE FALSE
## 咽喉拭子_檢驗中 咽喉拭子_陰性
## 1 FALSE TRUE
names(throat)
## [1] "咽喉拭子_2019nCoV" "咽喉拭子_A未分型" "咽喉拭子_B型"
## [4] "咽喉拭子_其他" "咽喉拭子_未收件" "咽喉拭子_檢驗中"
## [7] "咽喉拭子_陰性"
names(throat)[throat[3,] > 0]
## [1] "咽喉拭子_2019nCoV" "咽喉拭子_陰性"
paste0(names(throat)[throat[3,] > 0] , collapse= '')
## [1] "咽喉拭子_2019nCoV咽喉拭子_陰性"
gsub('咽喉拭子_','',paste0(names(throat)[throat[3,] > 0] , collapse= ''))
## [1] "2019nCoV陰性"
throat_result <- apply( throat, MARGIN=1, FUN=function(x){ paste(names(throat)[x > 0],collapse='') })
throat_result <- gsub('咽喉拭子_','',throat_result)
overall_judge$咽喉結果描述 <- throat_result
overall_judge %>%
head()
原本邏輯
=IF(
OR(AX4=0,AX4="總計"),"",
IF(AO4="","","未收件")&
IF(AP4="","","未採檢")&
IF(AQ4="","","其他")&
IF(AR4="","","陰性")&
IF(AS4="","","檢驗中")&
IF(AT4="","","檢體保留")&
IF(AN4="","","B型")&
IF(AM4="","","A未分型")&
IF(AL4="","","2019nCoV")
)
R語言邏輯
a <- c('A123', 'B234', 'A345', 'C567')
grepl('A', a)
## [1] TRUE FALSE TRUE FALSE
a[grepl('A', a)]
## [1] "A123" "A345"
sputum <- lab_pivot[ , grepl( "痰_" , names( lab_pivot ) ) ]
sputum_result <- apply( sputum, MARGIN=1, FUN=function(x){ paste(names(sputum)[x > 0],collapse='') })
sputum_result <- gsub('痰_','',sputum_result)
overall_judge$痰結果描述 <- sputum_result
overall_judge %>%
head()
=IF(
OR(AX5=0,AX5="總計"),"",
IF(W5="","","未收件")&
IF(X5="","","未採檢")&
IF(Y5="","","其他")&
IF(Z5="","","陰性")&
IF(AA5="","","檢驗中")&
IF(AB5="","","檢體保留")&
IF(V5="","","B型")&
IF(U5="","","A未分型")&
IF(T5="","","2019nCoV")
)
R語言邏輯
lab_pivot
#names( lab_pivot )[grepl( "其他_" , names( lab_pivot ) )]
others <- lab_pivot[ , grepl( "其他_" , names( lab_pivot ) ) ]
others <- data.frame(其他_陰性 = others)
others_result <- apply( others, MARGIN=1, FUN=function(x){ paste(names(others)[x > 0],collapse='') })
others_result <- gsub('其他_','',others_result)
overall_judge$其他檢體結果描述 <- others_result
overall_judge %>%
head()
=IF(
AY4="","未採檢",
IF(TYPE(SEARCH("~nCoV",AY4))=1,"2019nCoV",
IF(TYPE(SEARCH("H1",AY4))=1,"H1N1",
IF(TYPE(SEARCH("H3",AY4))=1,"H3N2",
IF(TYPE(SEARCH("A未分型",AY4))=1," A未分型",
IF(TYPE(SEARCH("B",AY4))=1,"B型",
IF(TYPE(SEARCH("未收件",AY4))=1,"未收件",
IF(TYPE(SEARCH("檢驗中",AY4))=1,"檢驗中",
IF(TYPE(SEARCH("陰性",AY4))=1,"陰性",
IF(TYPE(SEARCH("其他",AY4))=1,"其他",
IF(TYPE(SEARCH("檢體保留",AY4))=1,"檢體保留",""))))))))))
)
result_labeling <- function(ret){
if(ret == ''){
'未採檢'
}else if( grepl('nCoV', ret) ){
'2019nCoV'
}else if( grepl('H1', ret) ){
'H1N1'
}else if( grepl('H3', ret) ){
'H3N2'
}else if( grepl('A未分型', ret) ){
'A未分型'
}else if( grepl('B', ret) ){
'B型'
}else if( grepl('未收件', ret) ){
'未收件'
}else if( grepl('檢驗中', ret) ){
'檢驗中'
}else if( grepl('陰性', ret) ){
'陰性'
}else if( grepl('其他', ret) ){
'其他'
}else if( grepl('檢體保留', ret) ){
'檢體保留'
}else{
''
}
}
overall_judge <- overall_judge %>%
mutate(`咽喉結果` = pmap_chr(list(`咽喉結果描述`), result_labeling) ) %>%
mutate(`痰結果` = pmap_chr(list(`痰結果描述`), result_labeling)) %>%
mutate(`其他檢體結果` = pmap_chr(list(`其他檢體結果描述`), result_labeling))
=IF(
OR(AX5=0,AX5="總計"),"",
IF(
TYPE(SEARCH("~nCoV",BB5&BC5&BD5))=1,"2019nCoV",
IF(
TYPE(SEARCH("H1",BB5&BC5&BD5))=1,"H1N1",
IF(
TYPE(SEARCH("H3",BB5&BC5&BD5))=1,"H3N2",
IF(
TYPE(SEARCH("A未分型",BB5&BC5&BD5))=1," A未分型",
IF(
TYPE(SEARCH("B",BB5&BC5&BD5))=1,"B型",
IF(
TYPE(SEARCH("未收件",BB5&BC5&BD5))=1,"未收件",
IF(
TYPE(SEARCH("檢驗中",BB5&BC5&BD5))=1,"檢驗中",
IF(
TYPE(SEARCH("陰性",BB5&BC5&BD5))=1,"陰性",
IF(
TYPE(SEARCH("其他",BB5&BC5&BD5))=1,"其他",
IF(
TYPE(SEARCH("檢體保留",BB5&BC5&@BD))=1,"檢體保留",
IF(
TYPE(SEARCH("未採檢",BB5&BC5&BD5))=1,"未採檢","")))))))))
)
)
)
mix_result_labeling <- function(ret){
if(ret == ''){
'未採檢'
}else if( grepl('nCoV', ret) ){
'2019nCoV'
}else if( grepl('H1', ret) ){
'H1N1'
}else if( grepl('H3', ret) ){
'H3N2'
}else if( grepl('A未分型', ret) ){
'A未分型'
}else if( grepl('B', ret) ){
'B型'
}else if( grepl('未收件', ret) ){
'未收件'
}else if( grepl('檢驗中', ret) ){
'檢驗中'
}else if( grepl('陰性', ret) ){
'陰性'
}else if( grepl('其他', ret) ){
'其他'
}else if( grepl('檢體保留', ret) ){
'檢體保留'
}else if( grepl('未採檢', ret) ){
'未採檢'
}else{
''
}
}
overall_judge <- overall_judge %>%
mutate(`綜合檢驗結果` =
pmap_chr(
list(
paste0(`咽喉結果`, `痰結果`, `其他檢體結果`)
), mix_result_labeling
)
)
overall_judge
tmp_judge <- overall_judge %>%
select(編號,綜合檢驗結果)
case_list <- case_list %>%
left_join(y= tmp_judge, by=c("流水號"="編號"))
case_list %>%
head()
case_list
gen_list <- case_list %>% filter(`2019年11月後` == 1)
pivot_gen <- dcast(gen_list, `通報疾病` ~ `綜合檢驗結果`, value.var = '流水號', fun.aggregate = length)
pivot_gen
case_list$區域 <- sample(c('台北區', '東區', '南區', '中區','高屏區', '北區'), 100, replace=T)
#install.packages('plotly')
library(ggplot2)
library(plotly)
##
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
##
## last_plot
## The following object is masked from 'package:stats':
##
## filter
## The following object is masked from 'package:graphics':
##
## layout
case_stat <- case_list %>%
group_by(區域, 報告日期, 通報疾病) %>%
summarise(數量 = length(流水號))
## `summarise()` regrouping output by '區域', '報告日期' (override with `.groups` argument)
# create ggplot
p <- ggplot(case_stat, aes(x=報告日期, y=數量, fill = 通報疾病)) +
geom_bar(position="stack", stat='identity') +
scale_fill_manual(values=c("#a4c8d3", "#ffd042","#bfdcab")) +
facet_wrap(~ 區域, ncol = 3, scales = 'free_y') +
labs(x='通報日') +
theme(axis.text.x = element_text(angle = 90,
hjust = 1,
size=5)) +
theme(legend.position = c(0.9, 0.5))
##facet_grid(. ~ 區域, scales = "free_x") +
ggplotly(p)
## Warning: `group_by_()` is deprecated as of dplyr 0.7.0.
## Please use `group_by()` instead.
## See vignette('programming') for more help
## This warning is displayed once every 8 hours.
## Call `lifecycle::last_warnings()` to see where this warning was generated.