#Load packages
Readme - data is wrangled #Data is in long-format and outcome variables are the ERDS parameters. #Baseline checks have been completed and all Phase Baseline periods are not significantly different from each other (although different baselines have been used) #Data files are avaliable on OSF here:
setwd("C:/Users/cutba/OneDrive - University of Twente/1_Conferences/2024_Conferences/Mobi_June24/Analysis/DFs")
#load the cleaned DF
#df = ave_data_LC
library(readr)
ave_data_LC <- read_csv("ave_data_LC.csv",
col_types = cols(subject = col_number(),
session = col_number(), h = col_number(),
trial_nr = col_number(), correct_trial = col_number(),
aveRT = col_number(), aveRTS = col_number(),
sumRT = col_number(), sumRTS = col_number()))
View(ave_data_LC)
# Seperating test and training blocks
df_train = ave_data_LC %>% filter(session < 5)
df_test =ave_data_LC %>% filter(session > 4)
#Factors training blocks
df_train$subject = factor(df_train$subject)
df_train$session = factor(df_train$session,ordered = TRUE, levels=c('1', '2', '3', '4'))
df_train$trial_nr= factor(df_train$trial_nr)
#Model
m.blktrainRT = lmer(aveRT ~ session + (session|subject) + (1|trial_nr) , data = df_train, REML = FALSE)
Anova(m.blktrainRT)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: aveRT
## Chisq Df Pr(>Chisq)
## session 44.222 3 1.354e-09 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.blktrainRT, ddf="Satterthwaite")
## Warning in summary.merMod(m.blktrainRT, ddf = "Satterthwaite"): additional
## arguments ignored
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: aveRT ~ session + (session | subject) + (1 | trial_nr)
## Data: df_train
##
## AIC BIC logLik deviance df.resid
## 22212.4 22301.0 -11090.2 22180.4 1856
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -3.9171 -0.5098 -0.0599 0.4287 6.7988
##
## Random effects:
## Groups Name Variance Std.Dev. Corr
## trial_nr (Intercept) 1608.0 40.10
## subject (Intercept) 20093.6 141.75
## session.L 10410.8 102.03 -0.02
## session.Q 1672.9 40.90 -0.29 -0.55
## session.C 579.5 24.07 0.22 -0.10 -0.59
## Residual 6673.2 81.69
## Number of obs: 1872, groups: trial_nr, 192; subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 390.195 41.069 9.501
## session.L -184.986 30.287 -6.108
## session.Q 70.219 13.712 5.121
## session.C -11.452 9.789 -1.170
##
## Correlation of Fixed Effects:
## (Intr) sssn.L sssn.Q
## session.L -0.021
## session.Q -0.248 -0.463
## session.C 0.153 -0.066 -0.364
#Posthocs training blocks
emm.mblktrainRT <- emmeans(m.blktrainRT, pairwise ~ session)
## Warning in checkConv(attr(opt, "derivs"), opt$par, ctrl = control$checkConv, :
## Model failed to converge with max|grad| = 0.00211875 (tol = 0.002, component 1)
print(emm.mblktrainRT)
## $emmeans
## session emmean SE df lower.CL upper.CL
## 1 552 48.4 13.4 448 656
## 2 389 47.3 13.4 287 491
## 3 321 45.3 13.5 224 419
## 4 299 45.0 13.5 202 395
##
## Degrees-of-freedom method: kenward-roger
## Confidence level used: 0.95
##
## $contrasts
## contrast estimate SE df t.ratio p.value
## session1 - session2 163.2 27.3 15.5 5.980 0.0001
## session1 - session3 230.6 36.9 14.4 6.248 0.0001
## session1 - session4 253.3 42.3 14.0 5.994 0.0002
## session2 - session3 67.4 20.1 18.3 3.347 0.0169
## session2 - session4 90.1 26.6 15.6 3.391 0.0180
## session3 - session4 22.8 13.4 30.2 1.693 0.3450
##
## Degrees-of-freedom method: kenward-roger
## P value adjustment: tukey method for comparing a family of 4 estimates
#Effects
ae.m.blktrainRT <- allEffects(m.blktrainRT)
ae.m.blktrainRT.df <- as.data.frame(ae.m.blktrainRT[[1]])
#Proper CIs
#change conf interval to 83%, match p = .05
ae.m.blktrainRT.df$l83 <- ae.m.blktrainRT.df$fit - 1.3722 * ae.m.blktrainRT.df$se
ae.m.blktrainRT.df$u83 <- ae.m.blktrainRT.df$fit + 1.3722 * ae.m.blktrainRT.df$se
# Effects Plot
plot.blktrain <- ggplot(ae.m.blktrainRT.df, aes(x=session, y=fit, ymin=l83, ymax=u83))+
geom_point(aes(color = session), size=3) +
geom_errorbar(aes(ymin=l83, ymax=u83, color= session), width=.1, size=1) +
geom_line() +
#geom_path(aes(x=session, y=fit, group=session, colour=session)) +
#geom_ribbon(aes(ymin=l83, ymax=u83, group=session, fill=session), alpha=0.2) +
ylab("RT (ms)")+
xlab("Block")+
ggtitle("Learning Phase RT")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))
## Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
## ℹ Please use `linewidth` instead.
print(plot.blktrain)
## `geom_line()`: Each group consists of only one observation.
## ℹ Do you need to adjust the group aesthetic?
#Factors training blocks
df_test$subject = factor(df_test$subject)
df_test$session = factor(df_test$session,ordered = TRUE, levels=c('5', '6'))
df_test$trial_nr= factor(df_test$trial_nr)
m.blktestRT = lmer(aveRT ~ session + (session|subject) + (1|trial_nr), data = df_test, REML = FALSE)
Anova(m.blktestRT)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: aveRT
## Chisq Df Pr(>Chisq)
## session 16.784 1 4.189e-05 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.blktestRT, ddf="Satterthwaite")
## Warning in summary.merMod(m.blktestRT, ddf = "Satterthwaite"): additional
## arguments ignored
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: aveRT ~ session + (session | subject) + (1 | trial_nr)
## Data: df_test
##
## AIC BIC logLik deviance df.resid
## 11016.3 11050.3 -5501.1 11002.3 945
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -2.6610 -0.5126 -0.0820 0.3039 6.6918
##
## Random effects:
## Groups Name Variance Std.Dev. Corr
## trial_nr (Intercept) 252.7 15.90
## subject (Intercept) 18557.8 136.23
## session.L 2518.9 50.19 0.04
## Residual 5284.9 72.70
## Number of obs: 952, groups: trial_nr, 96; subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 311.01 39.43 7.887
## session.L 61.67 15.05 4.097
##
## Correlation of Fixed Effects:
## (Intr)
## session.L 0.042
#Posthocs testing blocks
emm.mblktestRT <- emmeans(m.blktestRT, pairwise ~ session)
print(emm.mblktestRT)
## $emmeans
## session emmean SE df lower.CL upper.CL
## 5 267 42.2 13.2 176 358
## 6 355 43.1 13.2 262 448
##
## Degrees-of-freedom method: kenward-roger
## Confidence level used: 0.95
##
## $contrasts
## contrast estimate SE df t.ratio p.value
## session5 - session6 -87.2 22.2 13.6 -3.930 0.0016
##
## Degrees-of-freedom method: kenward-roger
#Effects
ae.m.blktestRT <- allEffects(m.blktestRT)
ae.m.blktestRT.df <- as.data.frame(ae.m.blktestRT[[1]])
#Proper CIs
#change conf interval to 83%, match p = .05
ae.m.blktestRT.df$l83 <- ae.m.blktestRT.df$fit - 1.3722 * ae.m.blktestRT.df$se
ae.m.blktestRT.df$u83 <- ae.m.blktestRT.df$fit + 1.3722 * ae.m.blktestRT.df$se
# Effects Plot
plot.blktest <- ggplot(ae.m.blktestRT.df, aes(x=session, y=fit, ymin=l83, ymax=u83))+
geom_point(aes(color = session), size=3) +
geom_errorbar(aes(ymin=l83, ymax=u83, color= session), width=.1, size=1) +
geom_line() +
#geom_path(aes(x=session, y=fit, group=session, colour=session)) +
#geom_ribbon(aes(ymin=l83, ymax=u83, group=session, fill=session), alpha=0.2) +
ylab("RT (ms)")+
xlab("Block")+
ggtitle("Learning Phase RT")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))
print(plot.blktest)
## `geom_line()`: Each group consists of only one observation.
## ℹ Do you need to adjust the group aesthetic?
setwd("C:/Users/cutba/OneDrive - University of Twente/1_Conferences/2024_Conferences/Mobi_June24/Analysis/DFs")
#dfload = final_data_steps
library(readxl)
final_data_steps <- read_excel("final_data_steps.xlsx",
col_types = c("numeric", "numeric", "numeric",
"numeric", "numeric", "numeric",
"numeric", "numeric", "numeric",
"numeric"))
## Warning: Coercing text to numeric in E2 / R2C5: '1'
## Warning: Coercing text to numeric in E3 / R3C5: '1'
## Warning: Coercing text to numeric in E4 / R4C5: '1'
## Warning: Coercing text to numeric in E5 / R5C5: '1'
## Warning: Coercing text to numeric in E6 / R6C5: '1'
## Warning: Coercing text to numeric in E7 / R7C5: '1'
## Warning: Coercing text to numeric in E8 / R8C5: '2'
## Warning: Coercing text to numeric in E9 / R9C5: '2'
## Warning: Coercing text to numeric in E10 / R10C5: '2'
## Warning: Coercing text to numeric in E11 / R11C5: '2'
## Warning: Coercing text to numeric in E12 / R12C5: '2'
## Warning: Coercing text to numeric in E13 / R13C5: '2'
## Warning: Coercing text to numeric in E14 / R14C5: '1'
## Warning: Coercing text to numeric in E15 / R15C5: '1'
## Warning: Coercing text to numeric in E16 / R16C5: '1'
## Warning: Coercing text to numeric in E17 / R17C5: '1'
## Warning: Coercing text to numeric in E18 / R18C5: '1'
## Warning: Coercing text to numeric in E19 / R19C5: '1'
## Warning: Coercing text to numeric in E20 / R20C5: '1'
## Warning: Coercing text to numeric in E21 / R21C5: '1'
## Warning: Coercing text to numeric in E22 / R22C5: '1'
## Warning: Coercing text to numeric in E23 / R23C5: '1'
## Warning: Coercing text to numeric in E24 / R24C5: '1'
## Warning: Coercing text to numeric in E25 / R25C5: '1'
## Warning: Coercing text to numeric in E26 / R26C5: '2'
## Warning: Coercing text to numeric in E27 / R27C5: '2'
## Warning: Coercing text to numeric in E28 / R28C5: '2'
## Warning: Coercing text to numeric in E29 / R29C5: '2'
## Warning: Coercing text to numeric in E30 / R30C5: '2'
## Warning: Coercing text to numeric in E31 / R31C5: '2'
## Warning: Coercing text to numeric in E32 / R32C5: '1'
## Warning: Coercing text to numeric in E33 / R33C5: '1'
## Warning: Coercing text to numeric in E34 / R34C5: '1'
## Warning: Coercing text to numeric in E35 / R35C5: '1'
## Warning: Coercing text to numeric in E36 / R36C5: '1'
## Warning: Coercing text to numeric in E37 / R37C5: '1'
## Warning: Coercing text to numeric in E38 / R38C5: '1'
## Warning: Coercing text to numeric in E39 / R39C5: '1'
## Warning: Coercing text to numeric in E40 / R40C5: '1'
## Warning: Coercing text to numeric in E41 / R41C5: '1'
## Warning: Coercing text to numeric in E42 / R42C5: '1'
## Warning: Coercing text to numeric in E43 / R43C5: '1'
## Warning: Coercing text to numeric in E44 / R44C5: '2'
## Warning: Coercing text to numeric in E45 / R45C5: '2'
## Warning: Coercing text to numeric in E46 / R46C5: '2'
## Warning: Coercing text to numeric in E47 / R47C5: '2'
## Warning: Coercing text to numeric in E48 / R48C5: '2'
## Warning: Coercing text to numeric in E49 / R49C5: '2'
## Warning: Coercing text to numeric in E50 / R50C5: '1'
## Warning: Coercing text to numeric in E51 / R51C5: '1'
## Warning: Coercing text to numeric in E52 / R52C5: '1'
## Warning: Coercing text to numeric in E53 / R53C5: '1'
## Warning: Coercing text to numeric in E54 / R54C5: '1'
## Warning: Coercing text to numeric in E55 / R55C5: '1'
## Warning: Coercing text to numeric in E56 / R56C5: '1'
## Warning: Coercing text to numeric in E57 / R57C5: '1'
## Warning: Coercing text to numeric in E58 / R58C5: '1'
## Warning: Coercing text to numeric in E59 / R59C5: '1'
## Warning: Coercing text to numeric in E60 / R60C5: '1'
## Warning: Coercing text to numeric in E61 / R61C5: '1'
## Warning: Coercing text to numeric in E62 / R62C5: '1'
## Warning: Coercing text to numeric in E63 / R63C5: '1'
## Warning: Coercing text to numeric in E64 / R64C5: '1'
## Warning: Coercing text to numeric in E65 / R65C5: '1'
## Warning: Coercing text to numeric in E66 / R66C5: '1'
## Warning: Coercing text to numeric in E67 / R67C5: '1'
## Warning: Coercing text to numeric in E68 / R68C5: '1'
## Warning: Coercing text to numeric in E69 / R69C5: '1'
## Warning: Coercing text to numeric in E70 / R70C5: '1'
## Warning: Coercing text to numeric in E71 / R71C5: '1'
## Warning: Coercing text to numeric in E72 / R72C5: '1'
## Warning: Coercing text to numeric in E73 / R73C5: '1'
## Warning: Coercing text to numeric in E74 / R74C5: '2'
## Warning: Coercing text to numeric in E75 / R75C5: '2'
## Warning: Coercing text to numeric in E76 / R76C5: '2'
## Warning: Coercing text to numeric in E77 / R77C5: '2'
## Warning: Coercing text to numeric in E78 / R78C5: '2'
## Warning: Coercing text to numeric in E79 / R79C5: '2'
## Warning: Coercing text to numeric in E80 / R80C5: '1'
## Warning: Coercing text to numeric in E81 / R81C5: '1'
## Warning: Coercing text to numeric in E82 / R82C5: '1'
## Warning: Coercing text to numeric in E83 / R83C5: '1'
## Warning: Coercing text to numeric in E84 / R84C5: '1'
## Warning: Coercing text to numeric in E85 / R85C5: '1'
## Warning: Coercing text to numeric in E86 / R86C5: '2'
## Warning: Coercing text to numeric in E87 / R87C5: '2'
## Warning: Coercing text to numeric in E88 / R88C5: '2'
## Warning: Coercing text to numeric in E89 / R89C5: '2'
## Warning: Coercing text to numeric in E90 / R90C5: '2'
## Warning: Coercing text to numeric in E91 / R91C5: '2'
## Warning: Coercing text to numeric in E92 / R92C5: '1'
## Warning: Coercing text to numeric in E93 / R93C5: '1'
## Warning: Coercing text to numeric in E94 / R94C5: '1'
## Warning: Coercing text to numeric in E95 / R95C5: '1'
## Warning: Coercing text to numeric in E96 / R96C5: '1'
## Warning: Coercing text to numeric in E97 / R97C5: '1'
## Warning: Coercing text to numeric in E98 / R98C5: '2'
## Warning: Coercing text to numeric in E99 / R99C5: '2'
## Warning: Coercing text to numeric in E100 / R100C5: '2'
## Warning: Coercing text to numeric in E101 / R101C5: '2'
## Warning: Coercing text to numeric in E102 / R102C5: '2'
## Warning: Coercing text to numeric in E103 / R103C5: '2'
## Warning: Coercing text to numeric in E104 / R104C5: '1'
## Warning: Coercing text to numeric in E105 / R105C5: '1'
## Warning: Coercing text to numeric in E106 / R106C5: '1'
## Warning: Coercing text to numeric in E107 / R107C5: '1'
## Warning: Coercing text to numeric in E108 / R108C5: '1'
## Warning: Coercing text to numeric in E109 / R109C5: '1'
## Warning: Coercing text to numeric in E110 / R110C5: '2'
## Warning: Coercing text to numeric in E111 / R111C5: '2'
## Warning: Coercing text to numeric in E112 / R112C5: '2'
## Warning: Coercing text to numeric in E113 / R113C5: '2'
## Warning: Coercing text to numeric in E114 / R114C5: '2'
## Warning: Coercing text to numeric in E115 / R115C5: '2'
## Warning: Coercing text to numeric in E116 / R116C5: '2'
## Warning: Coercing text to numeric in E117 / R117C5: '2'
## Warning: Coercing text to numeric in E118 / R118C5: '2'
## Warning: Coercing text to numeric in E119 / R119C5: '2'
## Warning: Coercing text to numeric in E120 / R120C5: '2'
## Warning: Coercing text to numeric in E121 / R121C5: '2'
## Warning: Coercing text to numeric in E122 / R122C5: '2'
## Warning: Coercing text to numeric in E123 / R123C5: '2'
## Warning: Coercing text to numeric in E124 / R124C5: '2'
## Warning: Coercing text to numeric in E125 / R125C5: '2'
## Warning: Coercing text to numeric in E126 / R126C5: '2'
## Warning: Coercing text to numeric in E127 / R127C5: '2'
## Warning: Coercing text to numeric in E128 / R128C5: '2'
## Warning: Coercing text to numeric in E129 / R129C5: '2'
## Warning: Coercing text to numeric in E130 / R130C5: '2'
## Warning: Coercing text to numeric in E131 / R131C5: '2'
## Warning: Coercing text to numeric in E132 / R132C5: '2'
## Warning: Coercing text to numeric in E133 / R133C5: '2'
## Warning: Coercing text to numeric in E134 / R134C5: '2'
## Warning: Coercing text to numeric in E135 / R135C5: '2'
## Warning: Coercing text to numeric in E136 / R136C5: '2'
## Warning: Coercing text to numeric in E137 / R137C5: '2'
## Warning: Coercing text to numeric in E138 / R138C5: '2'
## Warning: Coercing text to numeric in E139 / R139C5: '2'
## Warning: Coercing text to numeric in E140 / R140C5: '2'
## Warning: Coercing text to numeric in E141 / R141C5: '2'
## Warning: Coercing text to numeric in E142 / R142C5: '2'
## Warning: Coercing text to numeric in E143 / R143C5: '2'
## Warning: Coercing text to numeric in E144 / R144C5: '2'
## Warning: Coercing text to numeric in E145 / R145C5: '2'
## Warning: Coercing text to numeric in E146 / R146C5: '1'
## Warning: Coercing text to numeric in E147 / R147C5: '1'
## Warning: Coercing text to numeric in E148 / R148C5: '1'
## Warning: Coercing text to numeric in E149 / R149C5: '1'
## Warning: Coercing text to numeric in E150 / R150C5: '1'
## Warning: Coercing text to numeric in E151 / R151C5: '1'
## Warning: Coercing text to numeric in E152 / R152C5: '1'
## Warning: Coercing text to numeric in E153 / R153C5: '1'
## Warning: Coercing text to numeric in E154 / R154C5: '1'
## Warning: Coercing text to numeric in E155 / R155C5: '1'
## Warning: Coercing text to numeric in E156 / R156C5: '1'
## Warning: Coercing text to numeric in E157 / R157C5: '1'
## Warning: Coercing text to numeric in E158 / R158C5: '1'
## Warning: Coercing text to numeric in E159 / R159C5: '1'
## Warning: Coercing text to numeric in E160 / R160C5: '1'
## Warning: Coercing text to numeric in E161 / R161C5: '1'
## Warning: Coercing text to numeric in E162 / R162C5: '1'
## Warning: Coercing text to numeric in E163 / R163C5: '1'
## Warning: Coercing text to numeric in E164 / R164C5: '2'
## Warning: Coercing text to numeric in E165 / R165C5: '2'
## Warning: Coercing text to numeric in E166 / R166C5: '2'
## Warning: Coercing text to numeric in E167 / R167C5: '2'
## Warning: Coercing text to numeric in E168 / R168C5: '2'
## Warning: Coercing text to numeric in E169 / R169C5: '2'
## Warning: Coercing text to numeric in E170 / R170C5: '1'
## Warning: Coercing text to numeric in E171 / R171C5: '1'
## Warning: Coercing text to numeric in E172 / R172C5: '1'
## Warning: Coercing text to numeric in E173 / R173C5: '1'
## Warning: Coercing text to numeric in E174 / R174C5: '1'
## Warning: Coercing text to numeric in E175 / R175C5: '1'
## Warning: Coercing text to numeric in E176 / R176C5: '2'
## Warning: Coercing text to numeric in E177 / R177C5: '2'
## Warning: Coercing text to numeric in E178 / R178C5: '2'
## Warning: Coercing text to numeric in E179 / R179C5: '2'
## Warning: Coercing text to numeric in E180 / R180C5: '2'
## Warning: Coercing text to numeric in E181 / R181C5: '2'
## Warning: Coercing text to numeric in E182 / R182C5: '1'
## Warning: Coercing text to numeric in E183 / R183C5: '1'
## Warning: Coercing text to numeric in E184 / R184C5: '1'
## Warning: Coercing text to numeric in E185 / R185C5: '1'
## Warning: Coercing text to numeric in E186 / R186C5: '1'
## Warning: Coercing text to numeric in E187 / R187C5: '1'
## Warning: Coercing text to numeric in E188 / R188C5: '2'
## Warning: Coercing text to numeric in E189 / R189C5: '2'
## Warning: Coercing text to numeric in E190 / R190C5: '2'
## Warning: Coercing text to numeric in E191 / R191C5: '2'
## Warning: Coercing text to numeric in E192 / R192C5: '2'
## Warning: Coercing text to numeric in E193 / R193C5: '2'
## Warning: Coercing text to numeric in E194 / R194C5: '2'
## Warning: Coercing text to numeric in E195 / R195C5: '2'
## Warning: Coercing text to numeric in E196 / R196C5: '2'
## Warning: Coercing text to numeric in E197 / R197C5: '2'
## Warning: Coercing text to numeric in E198 / R198C5: '2'
## Warning: Coercing text to numeric in E199 / R199C5: '2'
## Warning: Coercing text to numeric in E200 / R200C5: '1'
## Warning: Coercing text to numeric in E201 / R201C5: '1'
## Warning: Coercing text to numeric in E202 / R202C5: '1'
## Warning: Coercing text to numeric in E203 / R203C5: '1'
## Warning: Coercing text to numeric in E204 / R204C5: '1'
## Warning: Coercing text to numeric in E205 / R205C5: '1'
## Warning: Coercing text to numeric in E206 / R206C5: '2'
## Warning: Coercing text to numeric in E207 / R207C5: '2'
## Warning: Coercing text to numeric in E208 / R208C5: '2'
## Warning: Coercing text to numeric in E209 / R209C5: '2'
## Warning: Coercing text to numeric in E210 / R210C5: '2'
## Warning: Coercing text to numeric in E211 / R211C5: '2'
## Warning: Coercing text to numeric in E212 / R212C5: '1'
## Warning: Coercing text to numeric in E213 / R213C5: '1'
## Warning: Coercing text to numeric in E214 / R214C5: '1'
## Warning: Coercing text to numeric in E215 / R215C5: '1'
## Warning: Coercing text to numeric in E216 / R216C5: '1'
## Warning: Coercing text to numeric in E217 / R217C5: '1'
## Warning: Coercing text to numeric in E218 / R218C5: '1'
## Warning: Coercing text to numeric in E219 / R219C5: '1'
## Warning: Coercing text to numeric in E220 / R220C5: '1'
## Warning: Coercing text to numeric in E221 / R221C5: '1'
## Warning: Coercing text to numeric in E222 / R222C5: '1'
## Warning: Coercing text to numeric in E223 / R223C5: '1'
## Warning: Coercing text to numeric in E224 / R224C5: '2'
## Warning: Coercing text to numeric in E225 / R225C5: '2'
## Warning: Coercing text to numeric in E226 / R226C5: '2'
## Warning: Coercing text to numeric in E227 / R227C5: '2'
## Warning: Coercing text to numeric in E228 / R228C5: '2'
## Warning: Coercing text to numeric in E229 / R229C5: '2'
## Warning: Coercing text to numeric in E230 / R230C5: '2'
## Warning: Coercing text to numeric in E231 / R231C5: '2'
## Warning: Coercing text to numeric in E232 / R232C5: '2'
## Warning: Coercing text to numeric in E233 / R233C5: '2'
## Warning: Coercing text to numeric in E234 / R234C5: '2'
## Warning: Coercing text to numeric in E235 / R235C5: '2'
## Warning: Coercing text to numeric in E236 / R236C5: '2'
## Warning: Coercing text to numeric in E237 / R237C5: '2'
## Warning: Coercing text to numeric in E238 / R238C5: '2'
## Warning: Coercing text to numeric in E239 / R239C5: '2'
## Warning: Coercing text to numeric in E240 / R240C5: '2'
## Warning: Coercing text to numeric in E241 / R241C5: '2'
## Warning: Coercing text to numeric in E242 / R242C5: '2'
## Warning: Coercing text to numeric in E243 / R243C5: '2'
## Warning: Coercing text to numeric in E244 / R244C5: '2'
## Warning: Coercing text to numeric in E245 / R245C5: '2'
## Warning: Coercing text to numeric in E246 / R246C5: '2'
## Warning: Coercing text to numeric in E247 / R247C5: '2'
## Warning: Coercing text to numeric in E248 / R248C5: '1'
## Warning: Coercing text to numeric in E249 / R249C5: '1'
## Warning: Coercing text to numeric in E250 / R250C5: '1'
## Warning: Coercing text to numeric in E251 / R251C5: '1'
## Warning: Coercing text to numeric in E252 / R252C5: '1'
## Warning: Coercing text to numeric in E253 / R253C5: '1'
## Warning: Coercing text to numeric in E254 / R254C5: '1'
## Warning: Coercing text to numeric in E255 / R255C5: '1'
## Warning: Coercing text to numeric in E256 / R256C5: '1'
## Warning: Coercing text to numeric in E257 / R257C5: '1'
## Warning: Coercing text to numeric in E258 / R258C5: '1'
## Warning: Coercing text to numeric in E259 / R259C5: '1'
## Warning: Coercing text to numeric in E260 / R260C5: '2'
## Warning: Coercing text to numeric in E261 / R261C5: '2'
## Warning: Coercing text to numeric in E262 / R262C5: '2'
## Warning: Coercing text to numeric in E263 / R263C5: '2'
## Warning: Coercing text to numeric in E264 / R264C5: '2'
## Warning: Coercing text to numeric in E265 / R265C5: '2'
## Warning: Coercing text to numeric in E266 / R266C5: '2'
## Warning: Coercing text to numeric in E267 / R267C5: '2'
## Warning: Coercing text to numeric in E268 / R268C5: '2'
## Warning: Coercing text to numeric in E269 / R269C5: '2'
## Warning: Coercing text to numeric in E270 / R270C5: '2'
## Warning: Coercing text to numeric in E271 / R271C5: '2'
## Warning: Coercing text to numeric in E272 / R272C5: '1'
## Warning: Coercing text to numeric in E273 / R273C5: '1'
## Warning: Coercing text to numeric in E274 / R274C5: '1'
## Warning: Coercing text to numeric in E275 / R275C5: '1'
## Warning: Coercing text to numeric in E276 / R276C5: '1'
## Warning: Coercing text to numeric in E277 / R277C5: '1'
## Warning: Coercing text to numeric in E278 / R278C5: '2'
## Warning: Coercing text to numeric in E279 / R279C5: '2'
## Warning: Coercing text to numeric in E280 / R280C5: '2'
## Warning: Coercing text to numeric in E281 / R281C5: '2'
## Warning: Coercing text to numeric in E282 / R282C5: '2'
## Warning: Coercing text to numeric in E283 / R283C5: '2'
## Warning: Coercing text to numeric in E284 / R284C5: '2'
## Warning: Coercing text to numeric in E285 / R285C5: '2'
## Warning: Coercing text to numeric in E286 / R286C5: '2'
## Warning: Coercing text to numeric in E287 / R287C5: '2'
## Warning: Coercing text to numeric in E288 / R288C5: '2'
## Warning: Coercing text to numeric in E289 / R289C5: '2'
## Warning: Coercing text to numeric in E290 / R290C5: '2'
## Warning: Coercing text to numeric in E291 / R291C5: '2'
## Warning: Coercing text to numeric in E292 / R292C5: '2'
## Warning: Coercing text to numeric in E293 / R293C5: '2'
## Warning: Coercing text to numeric in E294 / R294C5: '2'
## Warning: Coercing text to numeric in E295 / R295C5: '2'
## Warning: Coercing text to numeric in E296 / R296C5: '1'
## Warning: Coercing text to numeric in E297 / R297C5: '1'
## Warning: Coercing text to numeric in E298 / R298C5: '1'
## Warning: Coercing text to numeric in E299 / R299C5: '1'
## Warning: Coercing text to numeric in E300 / R300C5: '1'
## Warning: Coercing text to numeric in E301 / R301C5: '1'
## Warning: Coercing text to numeric in E302 / R302C5: '1'
## Warning: Coercing text to numeric in E303 / R303C5: '1'
## Warning: Coercing text to numeric in E304 / R304C5: '1'
## Warning: Coercing text to numeric in E305 / R305C5: '1'
## Warning: Coercing text to numeric in E306 / R306C5: '1'
## Warning: Coercing text to numeric in E307 / R307C5: '1'
## Warning: Coercing text to numeric in E308 / R308C5: '2'
## Warning: Coercing text to numeric in E309 / R309C5: '2'
## Warning: Coercing text to numeric in E310 / R310C5: '2'
## Warning: Coercing text to numeric in E311 / R311C5: '2'
## Warning: Coercing text to numeric in E312 / R312C5: '2'
## Warning: Coercing text to numeric in E313 / R313C5: '2'
## Warning: Coercing text to numeric in E314 / R314C5: '2'
## Warning: Coercing text to numeric in E315 / R315C5: '2'
## Warning: Coercing text to numeric in E316 / R316C5: '2'
## Warning: Coercing text to numeric in E317 / R317C5: '2'
## Warning: Coercing text to numeric in E318 / R318C5: '2'
## Warning: Coercing text to numeric in E319 / R319C5: '2'
## Warning: Coercing text to numeric in E320 / R320C5: '1'
## Warning: Coercing text to numeric in E321 / R321C5: '1'
## Warning: Coercing text to numeric in E322 / R322C5: '1'
## Warning: Coercing text to numeric in E323 / R323C5: '1'
## Warning: Coercing text to numeric in E324 / R324C5: '1'
## Warning: Coercing text to numeric in E325 / R325C5: '1'
## Warning: Coercing text to numeric in E326 / R326C5: '1'
## Warning: Coercing text to numeric in E327 / R327C5: '1'
## Warning: Coercing text to numeric in E328 / R328C5: '1'
## Warning: Coercing text to numeric in E329 / R329C5: '1'
## Warning: Coercing text to numeric in E330 / R330C5: '1'
## Warning: Coercing text to numeric in E331 / R331C5: '1'
## Warning: Coercing text to numeric in E332 / R332C5: '2'
## Warning: Coercing text to numeric in E333 / R333C5: '2'
## Warning: Coercing text to numeric in E334 / R334C5: '2'
## Warning: Coercing text to numeric in E335 / R335C5: '2'
## Warning: Coercing text to numeric in E336 / R336C5: '2'
## Warning: Coercing text to numeric in E337 / R337C5: '2'
## Warning: Coercing text to numeric in E338 / R338C5: '2'
## Warning: Coercing text to numeric in E339 / R339C5: '2'
## Warning: Coercing text to numeric in E340 / R340C5: '2'
## Warning: Coercing text to numeric in E341 / R341C5: '2'
## Warning: Coercing text to numeric in E342 / R342C5: '2'
## Warning: Coercing text to numeric in E343 / R343C5: '2'
## Warning: Coercing text to numeric in E344 / R344C5: '2'
## Warning: Coercing text to numeric in E345 / R345C5: '2'
## Warning: Coercing text to numeric in E346 / R346C5: '2'
## Warning: Coercing text to numeric in E347 / R347C5: '2'
## Warning: Coercing text to numeric in E348 / R348C5: '2'
## Warning: Coercing text to numeric in E349 / R349C5: '2'
## Warning: Coercing text to numeric in E350 / R350C5: '1'
## Warning: Coercing text to numeric in E351 / R351C5: '1'
## Warning: Coercing text to numeric in E352 / R352C5: '1'
## Warning: Coercing text to numeric in E353 / R353C5: '1'
## Warning: Coercing text to numeric in E354 / R354C5: '1'
## Warning: Coercing text to numeric in E355 / R355C5: '1'
## Warning: Coercing text to numeric in E356 / R356C5: '1'
## Warning: Coercing text to numeric in E357 / R357C5: '1'
## Warning: Coercing text to numeric in E358 / R358C5: '1'
## Warning: Coercing text to numeric in E359 / R359C5: '1'
## Warning: Coercing text to numeric in E360 / R360C5: '1'
## Warning: Coercing text to numeric in E361 / R361C5: '1'
## Warning: Coercing text to numeric in E362 / R362C5: '1'
## Warning: Coercing text to numeric in E363 / R363C5: '1'
## Warning: Coercing text to numeric in E364 / R364C5: '1'
## Warning: Coercing text to numeric in E365 / R365C5: '1'
## Warning: Coercing text to numeric in E366 / R366C5: '1'
## Warning: Coercing text to numeric in E367 / R367C5: '1'
## Warning: Coercing text to numeric in E368 / R368C5: '1'
## Warning: Coercing text to numeric in E369 / R369C5: '1'
## Warning: Coercing text to numeric in E370 / R370C5: '1'
## Warning: Coercing text to numeric in E371 / R371C5: '1'
## Warning: Coercing text to numeric in E372 / R372C5: '1'
## Warning: Coercing text to numeric in E373 / R373C5: '1'
## Warning: Coercing text to numeric in E374 / R374C5: '2'
## Warning: Coercing text to numeric in E375 / R375C5: '2'
## Warning: Coercing text to numeric in E376 / R376C5: '2'
## Warning: Coercing text to numeric in E377 / R377C5: '2'
## Warning: Coercing text to numeric in E378 / R378C5: '2'
## Warning: Coercing text to numeric in E379 / R379C5: '2'
## Warning: Coercing text to numeric in E380 / R380C5: '1'
## Warning: Coercing text to numeric in E381 / R381C5: '1'
## Warning: Coercing text to numeric in E382 / R382C5: '1'
## Warning: Coercing text to numeric in E383 / R383C5: '1'
## Warning: Coercing text to numeric in E384 / R384C5: '1'
## Warning: Coercing text to numeric in E385 / R385C5: '1'
## Warning: Coercing text to numeric in E386 / R386C5: '2'
## Warning: Coercing text to numeric in E387 / R387C5: '2'
## Warning: Coercing text to numeric in E388 / R388C5: '2'
## Warning: Coercing text to numeric in E389 / R389C5: '2'
## Warning: Coercing text to numeric in E390 / R390C5: '2'
## Warning: Coercing text to numeric in E391 / R391C5: '2'
## Warning: Coercing text to numeric in E392 / R392C5: '1'
## Warning: Coercing text to numeric in E393 / R393C5: '1'
## Warning: Coercing text to numeric in E394 / R394C5: '1'
## Warning: Coercing text to numeric in E395 / R395C5: '1'
## Warning: Coercing text to numeric in E396 / R396C5: '1'
## Warning: Coercing text to numeric in E397 / R397C5: '1'
## Warning: Coercing text to numeric in E398 / R398C5: '2'
## Warning: Coercing text to numeric in E399 / R399C5: '2'
## Warning: Coercing text to numeric in E400 / R400C5: '2'
## Warning: Coercing text to numeric in E401 / R401C5: '2'
## Warning: Coercing text to numeric in E402 / R402C5: '2'
## Warning: Coercing text to numeric in E403 / R403C5: '2'
## Warning: Coercing text to numeric in E404 / R404C5: '1'
## Warning: Coercing text to numeric in E405 / R405C5: '1'
## Warning: Coercing text to numeric in E406 / R406C5: '1'
## Warning: Coercing text to numeric in E407 / R407C5: '1'
## Warning: Coercing text to numeric in E408 / R408C5: '1'
## Warning: Coercing text to numeric in E409 / R409C5: '1'
## Warning: Coercing text to numeric in E410 / R410C5: '2'
## Warning: Coercing text to numeric in E411 / R411C5: '2'
## Warning: Coercing text to numeric in E412 / R412C5: '2'
## Warning: Coercing text to numeric in E413 / R413C5: '2'
## Warning: Coercing text to numeric in E414 / R414C5: '2'
## Warning: Coercing text to numeric in E415 / R415C5: '2'
## Warning: Coercing text to numeric in E416 / R416C5: '1'
## Warning: Coercing text to numeric in E417 / R417C5: '1'
## Warning: Coercing text to numeric in E418 / R418C5: '1'
## Warning: Coercing text to numeric in E419 / R419C5: '1'
## Warning: Coercing text to numeric in E420 / R420C5: '1'
## Warning: Coercing text to numeric in E421 / R421C5: '1'
## Warning: Coercing text to numeric in E422 / R422C5: '2'
## Warning: Coercing text to numeric in E423 / R423C5: '2'
## Warning: Coercing text to numeric in E424 / R424C5: '2'
## Warning: Coercing text to numeric in E425 / R425C5: '2'
## Warning: Coercing text to numeric in E426 / R426C5: '2'
## Warning: Coercing text to numeric in E427 / R427C5: '2'
## Warning: Coercing text to numeric in E428 / R428C5: '2'
## Warning: Coercing text to numeric in E429 / R429C5: '2'
## Warning: Coercing text to numeric in E430 / R430C5: '2'
## Warning: Coercing text to numeric in E431 / R431C5: '2'
## Warning: Coercing text to numeric in E432 / R432C5: '2'
## Warning: Coercing text to numeric in E433 / R433C5: '2'
## Warning: Coercing text to numeric in E434 / R434C5: '2'
## Warning: Coercing text to numeric in E435 / R435C5: '2'
## Warning: Coercing text to numeric in E436 / R436C5: '2'
## Warning: Coercing text to numeric in E437 / R437C5: '2'
## Warning: Coercing text to numeric in E438 / R438C5: '2'
## Warning: Coercing text to numeric in E439 / R439C5: '2'
## Warning: Coercing text to numeric in E440 / R440C5: '1'
## Warning: Coercing text to numeric in E441 / R441C5: '1'
## Warning: Coercing text to numeric in E442 / R442C5: '1'
## Warning: Coercing text to numeric in E443 / R443C5: '1'
## Warning: Coercing text to numeric in E444 / R444C5: '1'
## Warning: Coercing text to numeric in E445 / R445C5: '1'
## Warning: Coercing text to numeric in E446 / R446C5: '1'
## Warning: Coercing text to numeric in E447 / R447C5: '1'
## Warning: Coercing text to numeric in E448 / R448C5: '1'
## Warning: Coercing text to numeric in E449 / R449C5: '1'
## Warning: Coercing text to numeric in E450 / R450C5: '1'
## Warning: Coercing text to numeric in E451 / R451C5: '1'
## Warning: Coercing text to numeric in E452 / R452C5: '1'
## Warning: Coercing text to numeric in E453 / R453C5: '1'
## Warning: Coercing text to numeric in E454 / R454C5: '1'
## Warning: Coercing text to numeric in E455 / R455C5: '1'
## Warning: Coercing text to numeric in E456 / R456C5: '1'
## Warning: Coercing text to numeric in E457 / R457C5: '1'
## Warning: Coercing text to numeric in E458 / R458C5: '2'
## Warning: Coercing text to numeric in E459 / R459C5: '2'
## Warning: Coercing text to numeric in E460 / R460C5: '2'
## Warning: Coercing text to numeric in E461 / R461C5: '2'
## Warning: Coercing text to numeric in E462 / R462C5: '2'
## Warning: Coercing text to numeric in E463 / R463C5: '2'
## Warning: Coercing text to numeric in E464 / R464C5: '2'
## Warning: Coercing text to numeric in E465 / R465C5: '2'
## Warning: Coercing text to numeric in E466 / R466C5: '2'
## Warning: Coercing text to numeric in E467 / R467C5: '2'
## Warning: Coercing text to numeric in E468 / R468C5: '2'
## Warning: Coercing text to numeric in E469 / R469C5: '2'
## Warning: Coercing text to numeric in E470 / R470C5: '2'
## Warning: Coercing text to numeric in E471 / R471C5: '2'
## Warning: Coercing text to numeric in E472 / R472C5: '2'
## Warning: Coercing text to numeric in E473 / R473C5: '2'
## Warning: Coercing text to numeric in E474 / R474C5: '2'
## Warning: Coercing text to numeric in E475 / R475C5: '2'
## Warning: Coercing text to numeric in E476 / R476C5: '1'
## Warning: Coercing text to numeric in E477 / R477C5: '1'
## Warning: Coercing text to numeric in E478 / R478C5: '1'
## Warning: Coercing text to numeric in E479 / R479C5: '1'
## Warning: Coercing text to numeric in E480 / R480C5: '1'
## Warning: Coercing text to numeric in E481 / R481C5: '1'
## Warning: Coercing text to numeric in E482 / R482C5: '1'
## Warning: Coercing text to numeric in E483 / R483C5: '1'
## Warning: Coercing text to numeric in E484 / R484C5: '1'
## Warning: Coercing text to numeric in E485 / R485C5: '1'
## Warning: Coercing text to numeric in E486 / R486C5: '1'
## Warning: Coercing text to numeric in E487 / R487C5: '1'
## Warning: Coercing text to numeric in E488 / R488C5: '2'
## Warning: Coercing text to numeric in E489 / R489C5: '2'
## Warning: Coercing text to numeric in E490 / R490C5: '2'
## Warning: Coercing text to numeric in E491 / R491C5: '2'
## Warning: Coercing text to numeric in E492 / R492C5: '2'
## Warning: Coercing text to numeric in E493 / R493C5: '2'
## Warning: Coercing text to numeric in E494 / R494C5: '1'
## Warning: Coercing text to numeric in E495 / R495C5: '1'
## Warning: Coercing text to numeric in E496 / R496C5: '1'
## Warning: Coercing text to numeric in E497 / R497C5: '1'
## Warning: Coercing text to numeric in E498 / R498C5: '1'
## Warning: Coercing text to numeric in E499 / R499C5: '1'
## Warning: Coercing text to numeric in E500 / R500C5: '1'
## Warning: Coercing text to numeric in E501 / R501C5: '1'
## Warning: Coercing text to numeric in E502 / R502C5: '1'
## Warning: Coercing text to numeric in E503 / R503C5: '1'
## Warning: Coercing text to numeric in E504 / R504C5: '1'
## Warning: Coercing text to numeric in E505 / R505C5: '1'
## Warning: Coercing text to numeric in E506 / R506C5: '1'
## Warning: Coercing text to numeric in E507 / R507C5: '1'
## Warning: Coercing text to numeric in E508 / R508C5: '1'
## Warning: Coercing text to numeric in E509 / R509C5: '1'
## Warning: Coercing text to numeric in E510 / R510C5: '1'
## Warning: Coercing text to numeric in E511 / R511C5: '1'
## Warning: Coercing text to numeric in E512 / R512C5: '1'
## Warning: Coercing text to numeric in E513 / R513C5: '1'
## Warning: Coercing text to numeric in E514 / R514C5: '1'
## Warning: Coercing text to numeric in E515 / R515C5: '1'
## Warning: Coercing text to numeric in E516 / R516C5: '1'
## Warning: Coercing text to numeric in E517 / R517C5: '1'
## Warning: Coercing text to numeric in E518 / R518C5: '2'
## Warning: Coercing text to numeric in E519 / R519C5: '2'
## Warning: Coercing text to numeric in E520 / R520C5: '2'
## Warning: Coercing text to numeric in E521 / R521C5: '2'
## Warning: Coercing text to numeric in E522 / R522C5: '2'
## Warning: Coercing text to numeric in E523 / R523C5: '2'
## Warning: Coercing text to numeric in E524 / R524C5: '2'
## Warning: Coercing text to numeric in E525 / R525C5: '2'
## Warning: Coercing text to numeric in E526 / R526C5: '2'
## Warning: Coercing text to numeric in E527 / R527C5: '2'
## Warning: Coercing text to numeric in E528 / R528C5: '2'
## Warning: Coercing text to numeric in E529 / R529C5: '2'
## Warning: Coercing text to numeric in E530 / R530C5: '2'
## Warning: Coercing text to numeric in E531 / R531C5: '2'
## Warning: Coercing text to numeric in E532 / R532C5: '2'
## Warning: Coercing text to numeric in E533 / R533C5: '2'
## Warning: Coercing text to numeric in E534 / R534C5: '2'
## Warning: Coercing text to numeric in E535 / R535C5: '2'
## Warning: Coercing text to numeric in E536 / R536C5: '2'
## Warning: Coercing text to numeric in E537 / R537C5: '2'
## Warning: Coercing text to numeric in E538 / R538C5: '2'
## Warning: Coercing text to numeric in E539 / R539C5: '2'
## Warning: Coercing text to numeric in E540 / R540C5: '2'
## Warning: Coercing text to numeric in E541 / R541C5: '2'
## Warning: Coercing text to numeric in E542 / R542C5: '2'
## Warning: Coercing text to numeric in E543 / R543C5: '2'
## Warning: Coercing text to numeric in E544 / R544C5: '2'
## Warning: Coercing text to numeric in E545 / R545C5: '2'
## Warning: Coercing text to numeric in E546 / R546C5: '2'
## Warning: Coercing text to numeric in E547 / R547C5: '2'
## Warning: Coercing text to numeric in E548 / R548C5: '1'
## Warning: Coercing text to numeric in E549 / R549C5: '1'
## Warning: Coercing text to numeric in E550 / R550C5: '1'
## Warning: Coercing text to numeric in E551 / R551C5: '1'
## Warning: Coercing text to numeric in E552 / R552C5: '1'
## Warning: Coercing text to numeric in E553 / R553C5: '1'
## Warning: Coercing text to numeric in E554 / R554C5: '2'
## Warning: Coercing text to numeric in E555 / R555C5: '2'
## Warning: Coercing text to numeric in E556 / R556C5: '2'
## Warning: Coercing text to numeric in E557 / R557C5: '2'
## Warning: Coercing text to numeric in E558 / R558C5: '2'
## Warning: Coercing text to numeric in E559 / R559C5: '2'
## Warning: Coercing text to numeric in E560 / R560C5: '2'
## Warning: Coercing text to numeric in E561 / R561C5: '2'
## Warning: Coercing text to numeric in E562 / R562C5: '2'
## Warning: Coercing text to numeric in E563 / R563C5: '2'
## Warning: Coercing text to numeric in E564 / R564C5: '2'
## Warning: Coercing text to numeric in E565 / R565C5: '2'
## Warning: Coercing text to numeric in E566 / R566C5: '1'
## Warning: Coercing text to numeric in E567 / R567C5: '1'
## Warning: Coercing text to numeric in E568 / R568C5: '1'
## Warning: Coercing text to numeric in E569 / R569C5: '1'
## Warning: Coercing text to numeric in E570 / R570C5: '1'
## Warning: Coercing text to numeric in E571 / R571C5: '1'
## Warning: Coercing text to numeric in E572 / R572C5: '1'
## Warning: Coercing text to numeric in E573 / R573C5: '1'
## Warning: Coercing text to numeric in E574 / R574C5: '1'
## Warning: Coercing text to numeric in E575 / R575C5: '1'
## Warning: Coercing text to numeric in E576 / R576C5: '1'
## Warning: Coercing text to numeric in E577 / R577C5: '1'
## Warning: Coercing text to numeric in E578 / R578C5: '2'
## Warning: Coercing text to numeric in E579 / R579C5: '2'
## Warning: Coercing text to numeric in E580 / R580C5: '2'
## Warning: Coercing text to numeric in E581 / R581C5: '2'
## Warning: Coercing text to numeric in E582 / R582C5: '2'
## Warning: Coercing text to numeric in E583 / R583C5: '2'
## Warning: Coercing text to numeric in E584 / R584C5: '2'
## Warning: Coercing text to numeric in E585 / R585C5: '2'
## Warning: Coercing text to numeric in E586 / R586C5: '2'
## Warning: Coercing text to numeric in E587 / R587C5: '2'
## Warning: Coercing text to numeric in E588 / R588C5: '2'
## Warning: Coercing text to numeric in E589 / R589C5: '2'
## Warning: Coercing text to numeric in E590 / R590C5: '1'
## Warning: Coercing text to numeric in E591 / R591C5: '1'
## Warning: Coercing text to numeric in E592 / R592C5: '1'
## Warning: Coercing text to numeric in E593 / R593C5: '1'
## Warning: Coercing text to numeric in E594 / R594C5: '1'
## Warning: Coercing text to numeric in E595 / R595C5: '1'
## Warning: Coercing text to numeric in E596 / R596C5: '2'
## Warning: Coercing text to numeric in E597 / R597C5: '2'
## Warning: Coercing text to numeric in E598 / R598C5: '2'
## Warning: Coercing text to numeric in E599 / R599C5: '2'
## Warning: Coercing text to numeric in E600 / R600C5: '2'
## Warning: Coercing text to numeric in E601 / R601C5: '2'
## Warning: Coercing text to numeric in E602 / R602C5: '2'
## Warning: Coercing text to numeric in E603 / R603C5: '2'
## Warning: Coercing text to numeric in E604 / R604C5: '2'
## Warning: Coercing text to numeric in E605 / R605C5: '2'
## Warning: Coercing text to numeric in E606 / R606C5: '2'
## Warning: Coercing text to numeric in E607 / R607C5: '2'
## Warning: Coercing text to numeric in E608 / R608C5: '2'
## Warning: Coercing text to numeric in E609 / R609C5: '2'
## Warning: Coercing text to numeric in E610 / R610C5: '2'
## Warning: Coercing text to numeric in E611 / R611C5: '2'
## Warning: Coercing text to numeric in E612 / R612C5: '2'
## Warning: Coercing text to numeric in E613 / R613C5: '2'
## Warning: Coercing text to numeric in E614 / R614C5: '2'
## Warning: Coercing text to numeric in E615 / R615C5: '2'
## Warning: Coercing text to numeric in E616 / R616C5: '2'
## Warning: Coercing text to numeric in E617 / R617C5: '2'
## Warning: Coercing text to numeric in E618 / R618C5: '2'
## Warning: Coercing text to numeric in E619 / R619C5: '2'
## Warning: Coercing text to numeric in E620 / R620C5: '2'
## Warning: Coercing text to numeric in E621 / R621C5: '2'
## Warning: Coercing text to numeric in E622 / R622C5: '2'
## Warning: Coercing text to numeric in E623 / R623C5: '2'
## Warning: Coercing text to numeric in E624 / R624C5: '2'
## Warning: Coercing text to numeric in E625 / R625C5: '2'
## Warning: Coercing text to numeric in E626 / R626C5: '1'
## Warning: Coercing text to numeric in E627 / R627C5: '1'
## Warning: Coercing text to numeric in E628 / R628C5: '1'
## Warning: Coercing text to numeric in E629 / R629C5: '1'
## Warning: Coercing text to numeric in E630 / R630C5: '1'
## Warning: Coercing text to numeric in E631 / R631C5: '1'
## Warning: Coercing text to numeric in E632 / R632C5: '1'
## Warning: Coercing text to numeric in E633 / R633C5: '1'
## Warning: Coercing text to numeric in E634 / R634C5: '1'
## Warning: Coercing text to numeric in E635 / R635C5: '1'
## Warning: Coercing text to numeric in E636 / R636C5: '1'
## Warning: Coercing text to numeric in E637 / R637C5: '1'
## Warning: Coercing text to numeric in E638 / R638C5: '1'
## Warning: Coercing text to numeric in E639 / R639C5: '1'
## Warning: Coercing text to numeric in E640 / R640C5: '1'
## Warning: Coercing text to numeric in E641 / R641C5: '1'
## Warning: Coercing text to numeric in E642 / R642C5: '1'
## Warning: Coercing text to numeric in E643 / R643C5: '1'
## Warning: Coercing text to numeric in E644 / R644C5: '2'
## Warning: Coercing text to numeric in E645 / R645C5: '2'
## Warning: Coercing text to numeric in E646 / R646C5: '2'
## Warning: Coercing text to numeric in E647 / R647C5: '2'
## Warning: Coercing text to numeric in E648 / R648C5: '2'
## Warning: Coercing text to numeric in E649 / R649C5: '2'
## Warning: Coercing text to numeric in E650 / R650C5: '1'
## Warning: Coercing text to numeric in E651 / R651C5: '1'
## Warning: Coercing text to numeric in E652 / R652C5: '1'
## Warning: Coercing text to numeric in E653 / R653C5: '1'
## Warning: Coercing text to numeric in E654 / R654C5: '1'
## Warning: Coercing text to numeric in E655 / R655C5: '1'
## Warning: Coercing text to numeric in E656 / R656C5: '1'
## Warning: Coercing text to numeric in E657 / R657C5: '1'
## Warning: Coercing text to numeric in E658 / R658C5: '1'
## Warning: Coercing text to numeric in E659 / R659C5: '1'
## Warning: Coercing text to numeric in E660 / R660C5: '1'
## Warning: Coercing text to numeric in E661 / R661C5: '1'
## Warning: Coercing text to numeric in E662 / R662C5: '2'
## Warning: Coercing text to numeric in E663 / R663C5: '2'
## Warning: Coercing text to numeric in E664 / R664C5: '2'
## Warning: Coercing text to numeric in E665 / R665C5: '2'
## Warning: Coercing text to numeric in E666 / R666C5: '2'
## Warning: Coercing text to numeric in E667 / R667C5: '2'
## Warning: Coercing text to numeric in E668 / R668C5: '1'
## Warning: Coercing text to numeric in E669 / R669C5: '1'
## Warning: Coercing text to numeric in E670 / R670C5: '1'
## Warning: Coercing text to numeric in E671 / R671C5: '1'
## Warning: Coercing text to numeric in E672 / R672C5: '1'
## Warning: Coercing text to numeric in E673 / R673C5: '1'
## Warning: Coercing text to numeric in E674 / R674C5: '2'
## Warning: Coercing text to numeric in E675 / R675C5: '2'
## Warning: Coercing text to numeric in E676 / R676C5: '2'
## Warning: Coercing text to numeric in E677 / R677C5: '2'
## Warning: Coercing text to numeric in E678 / R678C5: '2'
## Warning: Coercing text to numeric in E679 / R679C5: '2'
## Warning: Coercing text to numeric in E680 / R680C5: '1'
## Warning: Coercing text to numeric in E681 / R681C5: '1'
## Warning: Coercing text to numeric in E682 / R682C5: '1'
## Warning: Coercing text to numeric in E683 / R683C5: '1'
## Warning: Coercing text to numeric in E684 / R684C5: '1'
## Warning: Coercing text to numeric in E685 / R685C5: '1'
## Warning: Coercing text to numeric in E686 / R686C5: '2'
## Warning: Coercing text to numeric in E687 / R687C5: '2'
## Warning: Coercing text to numeric in E688 / R688C5: '2'
## Warning: Coercing text to numeric in E689 / R689C5: '2'
## Warning: Coercing text to numeric in E690 / R690C5: '2'
## Warning: Coercing text to numeric in E691 / R691C5: '2'
## Warning: Coercing text to numeric in E692 / R692C5: '1'
## Warning: Coercing text to numeric in E693 / R693C5: '1'
## Warning: Coercing text to numeric in E694 / R694C5: '1'
## Warning: Coercing text to numeric in E695 / R695C5: '1'
## Warning: Coercing text to numeric in E696 / R696C5: '1'
## Warning: Coercing text to numeric in E697 / R697C5: '1'
## Warning: Coercing text to numeric in E698 / R698C5: '1'
## Warning: Coercing text to numeric in E699 / R699C5: '1'
## Warning: Coercing text to numeric in E700 / R700C5: '1'
## Warning: Coercing text to numeric in E701 / R701C5: '1'
## Warning: Coercing text to numeric in E702 / R702C5: '1'
## Warning: Coercing text to numeric in E703 / R703C5: '1'
## Warning: Coercing text to numeric in E704 / R704C5: '2'
## Warning: Coercing text to numeric in E705 / R705C5: '2'
## Warning: Coercing text to numeric in E706 / R706C5: '2'
## Warning: Coercing text to numeric in E707 / R707C5: '2'
## Warning: Coercing text to numeric in E708 / R708C5: '2'
## Warning: Coercing text to numeric in E709 / R709C5: '2'
## Warning: Coercing text to numeric in E710 / R710C5: '1'
## Warning: Coercing text to numeric in E711 / R711C5: '1'
## Warning: Coercing text to numeric in E712 / R712C5: '1'
## Warning: Coercing text to numeric in E713 / R713C5: '1'
## Warning: Coercing text to numeric in E714 / R714C5: '1'
## Warning: Coercing text to numeric in E715 / R715C5: '1'
## Warning: Coercing text to numeric in E716 / R716C5: '2'
## Warning: Coercing text to numeric in E717 / R717C5: '2'
## Warning: Coercing text to numeric in E718 / R718C5: '2'
## Warning: Coercing text to numeric in E719 / R719C5: '2'
## Warning: Coercing text to numeric in E720 / R720C5: '2'
## Warning: Coercing text to numeric in E721 / R721C5: '2'
## Warning: Coercing text to numeric in E722 / R722C5: '1'
## Warning: Coercing text to numeric in E723 / R723C5: '1'
## Warning: Coercing text to numeric in E724 / R724C5: '1'
## Warning: Coercing text to numeric in E725 / R725C5: '1'
## Warning: Coercing text to numeric in E726 / R726C5: '1'
## Warning: Coercing text to numeric in E727 / R727C5: '1'
## Warning: Coercing text to numeric in E728 / R728C5: '1'
## Warning: Coercing text to numeric in E729 / R729C5: '1'
## Warning: Coercing text to numeric in E730 / R730C5: '1'
## Warning: Coercing text to numeric in E731 / R731C5: '1'
## Warning: Coercing text to numeric in E732 / R732C5: '1'
## Warning: Coercing text to numeric in E733 / R733C5: '1'
## Warning: Coercing text to numeric in E734 / R734C5: '2'
## Warning: Coercing text to numeric in E735 / R735C5: '2'
## Warning: Coercing text to numeric in E736 / R736C5: '2'
## Warning: Coercing text to numeric in E737 / R737C5: '2'
## Warning: Coercing text to numeric in E738 / R738C5: '2'
## Warning: Coercing text to numeric in E739 / R739C5: '2'
## Warning: Coercing text to numeric in E740 / R740C5: '2'
## Warning: Coercing text to numeric in E741 / R741C5: '2'
## Warning: Coercing text to numeric in E742 / R742C5: '2'
## Warning: Coercing text to numeric in E743 / R743C5: '2'
## Warning: Coercing text to numeric in E744 / R744C5: '2'
## Warning: Coercing text to numeric in E745 / R745C5: '2'
## Warning: Coercing text to numeric in E746 / R746C5: '1'
## Warning: Coercing text to numeric in E747 / R747C5: '1'
## Warning: Coercing text to numeric in E748 / R748C5: '1'
## Warning: Coercing text to numeric in E749 / R749C5: '1'
## Warning: Coercing text to numeric in E750 / R750C5: '1'
## Warning: Coercing text to numeric in E751 / R751C5: '1'
## Warning: Coercing text to numeric in E752 / R752C5: '1'
## Warning: Coercing text to numeric in E753 / R753C5: '1'
## Warning: Coercing text to numeric in E754 / R754C5: '1'
## Warning: Coercing text to numeric in E755 / R755C5: '1'
## Warning: Coercing text to numeric in E756 / R756C5: '1'
## Warning: Coercing text to numeric in E757 / R757C5: '1'
## Warning: Coercing text to numeric in E758 / R758C5: '2'
## Warning: Coercing text to numeric in E759 / R759C5: '2'
## Warning: Coercing text to numeric in E760 / R760C5: '2'
## Warning: Coercing text to numeric in E761 / R761C5: '2'
## Warning: Coercing text to numeric in E762 / R762C5: '2'
## Warning: Coercing text to numeric in E763 / R763C5: '2'
## Warning: Coercing text to numeric in E764 / R764C5: '1'
## Warning: Coercing text to numeric in E765 / R765C5: '1'
## Warning: Coercing text to numeric in E766 / R766C5: '1'
## Warning: Coercing text to numeric in E767 / R767C5: '1'
## Warning: Coercing text to numeric in E768 / R768C5: '1'
## Warning: Coercing text to numeric in E769 / R769C5: '1'
## Warning: Coercing text to numeric in E770 / R770C5: '2'
## Warning: Coercing text to numeric in E771 / R771C5: '2'
## Warning: Coercing text to numeric in E772 / R772C5: '2'
## Warning: Coercing text to numeric in E773 / R773C5: '2'
## Warning: Coercing text to numeric in E774 / R774C5: '2'
## Warning: Coercing text to numeric in E775 / R775C5: '2'
## Warning: Coercing text to numeric in E776 / R776C5: '2'
## Warning: Coercing text to numeric in E777 / R777C5: '2'
## Warning: Coercing text to numeric in E778 / R778C5: '2'
## Warning: Coercing text to numeric in E779 / R779C5: '2'
## Warning: Coercing text to numeric in E780 / R780C5: '2'
## Warning: Coercing text to numeric in E781 / R781C5: '2'
## Warning: Coercing text to numeric in E782 / R782C5: '2'
## Warning: Coercing text to numeric in E783 / R783C5: '2'
## Warning: Coercing text to numeric in E784 / R784C5: '2'
## Warning: Coercing text to numeric in E785 / R785C5: '2'
## Warning: Coercing text to numeric in E786 / R786C5: '2'
## Warning: Coercing text to numeric in E787 / R787C5: '2'
## Warning: Coercing text to numeric in E788 / R788C5: '1'
## Warning: Coercing text to numeric in E789 / R789C5: '1'
## Warning: Coercing text to numeric in E790 / R790C5: '1'
## Warning: Coercing text to numeric in E791 / R791C5: '1'
## Warning: Coercing text to numeric in E792 / R792C5: '1'
## Warning: Coercing text to numeric in E793 / R793C5: '1'
## Warning: Coercing text to numeric in E794 / R794C5: '1'
## Warning: Coercing text to numeric in E795 / R795C5: '1'
## Warning: Coercing text to numeric in E796 / R796C5: '1'
## Warning: Coercing text to numeric in E797 / R797C5: '1'
## Warning: Coercing text to numeric in E798 / R798C5: '1'
## Warning: Coercing text to numeric in E799 / R799C5: '1'
## Warning: Coercing text to numeric in E800 / R800C5: '1'
## Warning: Coercing text to numeric in E801 / R801C5: '1'
## Warning: Coercing text to numeric in E802 / R802C5: '1'
## Warning: Coercing text to numeric in E803 / R803C5: '1'
## Warning: Coercing text to numeric in E804 / R804C5: '1'
## Warning: Coercing text to numeric in E805 / R805C5: '1'
## Warning: Coercing text to numeric in E806 / R806C5: '2'
## Warning: Coercing text to numeric in E807 / R807C5: '2'
## Warning: Coercing text to numeric in E808 / R808C5: '2'
## Warning: Coercing text to numeric in E809 / R809C5: '2'
## Warning: Coercing text to numeric in E810 / R810C5: '2'
## Warning: Coercing text to numeric in E811 / R811C5: '2'
## Warning: Coercing text to numeric in E812 / R812C5: '2'
## Warning: Coercing text to numeric in E813 / R813C5: '2'
## Warning: Coercing text to numeric in E814 / R814C5: '2'
## Warning: Coercing text to numeric in E815 / R815C5: '2'
## Warning: Coercing text to numeric in E816 / R816C5: '2'
## Warning: Coercing text to numeric in E817 / R817C5: '2'
## Warning: Coercing text to numeric in E818 / R818C5: '1'
## Warning: Coercing text to numeric in E819 / R819C5: '1'
## Warning: Coercing text to numeric in E820 / R820C5: '1'
## Warning: Coercing text to numeric in E821 / R821C5: '1'
## Warning: Coercing text to numeric in E822 / R822C5: '1'
## Warning: Coercing text to numeric in E823 / R823C5: '1'
## Warning: Coercing text to numeric in E824 / R824C5: '2'
## Warning: Coercing text to numeric in E825 / R825C5: '2'
## Warning: Coercing text to numeric in E826 / R826C5: '2'
## Warning: Coercing text to numeric in E827 / R827C5: '2'
## Warning: Coercing text to numeric in E828 / R828C5: '2'
## Warning: Coercing text to numeric in E829 / R829C5: '2'
## Warning: Coercing text to numeric in E830 / R830C5: '1'
## Warning: Coercing text to numeric in E831 / R831C5: '1'
## Warning: Coercing text to numeric in E832 / R832C5: '1'
## Warning: Coercing text to numeric in E833 / R833C5: '1'
## Warning: Coercing text to numeric in E834 / R834C5: '1'
## Warning: Coercing text to numeric in E835 / R835C5: '1'
## Warning: Coercing text to numeric in E836 / R836C5: '1'
## Warning: Coercing text to numeric in E837 / R837C5: '1'
## Warning: Coercing text to numeric in E838 / R838C5: '1'
## Warning: Coercing text to numeric in E839 / R839C5: '1'
## Warning: Coercing text to numeric in E840 / R840C5: '1'
## Warning: Coercing text to numeric in E841 / R841C5: '1'
## Warning: Coercing text to numeric in E842 / R842C5: '1'
## Warning: Coercing text to numeric in E843 / R843C5: '1'
## Warning: Coercing text to numeric in E844 / R844C5: '1'
## Warning: Coercing text to numeric in E845 / R845C5: '1'
## Warning: Coercing text to numeric in E846 / R846C5: '1'
## Warning: Coercing text to numeric in E847 / R847C5: '1'
## Warning: Coercing text to numeric in E848 / R848C5: '2'
## Warning: Coercing text to numeric in E849 / R849C5: '2'
## Warning: Coercing text to numeric in E850 / R850C5: '2'
## Warning: Coercing text to numeric in E851 / R851C5: '2'
## Warning: Coercing text to numeric in E852 / R852C5: '2'
## Warning: Coercing text to numeric in E853 / R853C5: '2'
## Warning: Coercing text to numeric in E854 / R854C5: '1'
## Warning: Coercing text to numeric in E855 / R855C5: '1'
## Warning: Coercing text to numeric in E856 / R856C5: '1'
## Warning: Coercing text to numeric in E857 / R857C5: '1'
## Warning: Coercing text to numeric in E858 / R858C5: '1'
## Warning: Coercing text to numeric in E859 / R859C5: '1'
## Warning: Coercing text to numeric in E860 / R860C5: '2'
## Warning: Coercing text to numeric in E861 / R861C5: '2'
## Warning: Coercing text to numeric in E862 / R862C5: '2'
## Warning: Coercing text to numeric in E863 / R863C5: '2'
## Warning: Coercing text to numeric in E864 / R864C5: '2'
## Warning: Coercing text to numeric in E865 / R865C5: '2'
## Warning: Coercing text to numeric in E866 / R866C5: '1'
## Warning: Coercing text to numeric in E867 / R867C5: '1'
## Warning: Coercing text to numeric in E868 / R868C5: '1'
## Warning: Coercing text to numeric in E869 / R869C5: '1'
## Warning: Coercing text to numeric in E870 / R870C5: '1'
## Warning: Coercing text to numeric in E871 / R871C5: '1'
## Warning: Coercing text to numeric in E872 / R872C5: '1'
## Warning: Coercing text to numeric in E873 / R873C5: '1'
## Warning: Coercing text to numeric in E874 / R874C5: '1'
## Warning: Coercing text to numeric in E875 / R875C5: '1'
## Warning: Coercing text to numeric in E876 / R876C5: '1'
## Warning: Coercing text to numeric in E877 / R877C5: '1'
## Warning: Coercing text to numeric in E878 / R878C5: '2'
## Warning: Coercing text to numeric in E879 / R879C5: '2'
## Warning: Coercing text to numeric in E880 / R880C5: '2'
## Warning: Coercing text to numeric in E881 / R881C5: '2'
## Warning: Coercing text to numeric in E882 / R882C5: '2'
## Warning: Coercing text to numeric in E883 / R883C5: '2'
## Warning: Coercing text to numeric in E884 / R884C5: '1'
## Warning: Coercing text to numeric in E885 / R885C5: '1'
## Warning: Coercing text to numeric in E886 / R886C5: '1'
## Warning: Coercing text to numeric in E887 / R887C5: '1'
## Warning: Coercing text to numeric in E888 / R888C5: '1'
## Warning: Coercing text to numeric in E889 / R889C5: '1'
## Warning: Coercing text to numeric in E890 / R890C5: '1'
## Warning: Coercing text to numeric in E891 / R891C5: '1'
## Warning: Coercing text to numeric in E892 / R892C5: '1'
## Warning: Coercing text to numeric in E893 / R893C5: '1'
## Warning: Coercing text to numeric in E894 / R894C5: '1'
## Warning: Coercing text to numeric in E895 / R895C5: '1'
## Warning: Coercing text to numeric in E896 / R896C5: '2'
## Warning: Coercing text to numeric in E897 / R897C5: '2'
## Warning: Coercing text to numeric in E898 / R898C5: '2'
## Warning: Coercing text to numeric in E899 / R899C5: '2'
## Warning: Coercing text to numeric in E900 / R900C5: '2'
## Warning: Coercing text to numeric in E901 / R901C5: '2'
## Warning: Coercing text to numeric in E902 / R902C5: '1'
## Warning: Coercing text to numeric in E903 / R903C5: '1'
## Warning: Coercing text to numeric in E904 / R904C5: '1'
## Warning: Coercing text to numeric in E905 / R905C5: '1'
## Warning: Coercing text to numeric in E906 / R906C5: '1'
## Warning: Coercing text to numeric in E907 / R907C5: '1'
## Warning: Coercing text to numeric in E908 / R908C5: '1'
## Warning: Coercing text to numeric in E909 / R909C5: '1'
## Warning: Coercing text to numeric in E910 / R910C5: '1'
## Warning: Coercing text to numeric in E911 / R911C5: '1'
## Warning: Coercing text to numeric in E912 / R912C5: '1'
## Warning: Coercing text to numeric in E913 / R913C5: '1'
## Warning: Coercing text to numeric in E914 / R914C5: '2'
## Warning: Coercing text to numeric in E915 / R915C5: '2'
## Warning: Coercing text to numeric in E916 / R916C5: '2'
## Warning: Coercing text to numeric in E917 / R917C5: '2'
## Warning: Coercing text to numeric in E918 / R918C5: '2'
## Warning: Coercing text to numeric in E919 / R919C5: '2'
## Warning: Coercing text to numeric in E920 / R920C5: '2'
## Warning: Coercing text to numeric in E921 / R921C5: '2'
## Warning: Coercing text to numeric in E922 / R922C5: '2'
## Warning: Coercing text to numeric in E923 / R923C5: '2'
## Warning: Coercing text to numeric in E924 / R924C5: '2'
## Warning: Coercing text to numeric in E925 / R925C5: '2'
## Warning: Coercing text to numeric in E926 / R926C5: '2'
## Warning: Coercing text to numeric in E927 / R927C5: '2'
## Warning: Coercing text to numeric in E928 / R928C5: '2'
## Warning: Coercing text to numeric in E929 / R929C5: '2'
## Warning: Coercing text to numeric in E930 / R930C5: '2'
## Warning: Coercing text to numeric in E931 / R931C5: '2'
## Warning: Coercing text to numeric in E932 / R932C5: '1'
## Warning: Coercing text to numeric in E933 / R933C5: '1'
## Warning: Coercing text to numeric in E934 / R934C5: '1'
## Warning: Coercing text to numeric in E935 / R935C5: '1'
## Warning: Coercing text to numeric in E936 / R936C5: '1'
## Warning: Coercing text to numeric in E937 / R937C5: '1'
## Warning: Coercing text to numeric in E938 / R938C5: '2'
## Warning: Coercing text to numeric in E939 / R939C5: '2'
## Warning: Coercing text to numeric in E940 / R940C5: '2'
## Warning: Coercing text to numeric in E941 / R941C5: '2'
## Warning: Coercing text to numeric in E942 / R942C5: '2'
## Warning: Coercing text to numeric in E943 / R943C5: '2'
## Warning: Coercing text to numeric in E944 / R944C5: '2'
## Warning: Coercing text to numeric in E945 / R945C5: '2'
## Warning: Coercing text to numeric in E946 / R946C5: '2'
## Warning: Coercing text to numeric in E947 / R947C5: '2'
## Warning: Coercing text to numeric in E948 / R948C5: '2'
## Warning: Coercing text to numeric in E949 / R949C5: '2'
## Warning: Coercing text to numeric in E950 / R950C5: '2'
## Warning: Coercing text to numeric in E951 / R951C5: '2'
## Warning: Coercing text to numeric in E952 / R952C5: '2'
## Warning: Coercing text to numeric in E953 / R953C5: '2'
## Warning: Coercing text to numeric in E954 / R954C5: '2'
## Warning: Coercing text to numeric in E955 / R955C5: '2'
## Warning: Coercing text to numeric in E956 / R956C5: '2'
## Warning: Coercing text to numeric in E957 / R957C5: '2'
## Warning: Coercing text to numeric in E958 / R958C5: '2'
## Warning: Coercing text to numeric in E959 / R959C5: '2'
## Warning: Coercing text to numeric in E960 / R960C5: '2'
## Warning: Coercing text to numeric in E961 / R961C5: '2'
## Warning: Coercing text to numeric in E962 / R962C5: '2'
## Warning: Coercing text to numeric in E963 / R963C5: '2'
## Warning: Coercing text to numeric in E964 / R964C5: '2'
## Warning: Coercing text to numeric in E965 / R965C5: '2'
## Warning: Coercing text to numeric in E966 / R966C5: '2'
## Warning: Coercing text to numeric in E967 / R967C5: '2'
## Warning: Coercing text to numeric in E968 / R968C5: '1'
## Warning: Coercing text to numeric in E969 / R969C5: '1'
## Warning: Coercing text to numeric in E970 / R970C5: '1'
## Warning: Coercing text to numeric in E971 / R971C5: '1'
## Warning: Coercing text to numeric in E972 / R972C5: '1'
## Warning: Coercing text to numeric in E973 / R973C5: '1'
## Warning: Coercing text to numeric in E974 / R974C5: '1'
## Warning: Coercing text to numeric in E975 / R975C5: '1'
## Warning: Coercing text to numeric in E976 / R976C5: '1'
## Warning: Coercing text to numeric in E977 / R977C5: '1'
## Warning: Coercing text to numeric in E978 / R978C5: '1'
## Warning: Coercing text to numeric in E979 / R979C5: '1'
## Warning: Coercing text to numeric in E980 / R980C5: '1'
## Warning: Coercing text to numeric in E981 / R981C5: '1'
## Warning: Coercing text to numeric in E982 / R982C5: '1'
## Warning: Coercing text to numeric in E983 / R983C5: '1'
## Warning: Coercing text to numeric in E984 / R984C5: '1'
## Warning: Coercing text to numeric in E985 / R985C5: '1'
## Warning: Coercing text to numeric in E986 / R986C5: '2'
## Warning: Coercing text to numeric in E987 / R987C5: '2'
## Warning: Coercing text to numeric in E988 / R988C5: '2'
## Warning: Coercing text to numeric in E989 / R989C5: '2'
## Warning: Coercing text to numeric in E990 / R990C5: '2'
## Warning: Coercing text to numeric in E991 / R991C5: '2'
## Warning: Coercing text to numeric in E992 / R992C5: '2'
## Warning: Coercing text to numeric in E993 / R993C5: '2'
## Warning: Coercing text to numeric in E994 / R994C5: '2'
## Warning: Coercing text to numeric in E995 / R995C5: '2'
## Warning: Coercing text to numeric in E996 / R996C5: '2'
## Warning: Coercing text to numeric in E997 / R997C5: '2'
## Warning: Coercing text to numeric in E998 / R998C5: '1'
## Warning: Coercing text to numeric in E999 / R999C5: '1'
## Warning: Coercing text to numeric in E1000 / R1000C5: '1'
## Warning: Coercing text to numeric in E1001 / R1001C5: '1'
## Warning: Coercing text to numeric in E1002 / R1002C5: '1'
## Warning: Coercing text to numeric in E1003 / R1003C5: '1'
## Warning: Coercing text to numeric in E1004 / R1004C5: '2'
## Warning: Coercing text to numeric in E1005 / R1005C5: '2'
## Warning: Coercing text to numeric in E1006 / R1006C5: '2'
## Warning: Coercing text to numeric in E1007 / R1007C5: '2'
## Warning: Coercing text to numeric in E1008 / R1008C5: '2'
## Warning: Coercing text to numeric in E1009 / R1009C5: '2'
## Warning: Coercing text to numeric in E1010 / R1010C5: '2'
## Warning: Coercing text to numeric in E1011 / R1011C5: '2'
## Warning: Coercing text to numeric in E1012 / R1012C5: '2'
## Warning: Coercing text to numeric in E1013 / R1013C5: '2'
## Warning: Coercing text to numeric in E1014 / R1014C5: '2'
## Warning: Coercing text to numeric in E1015 / R1015C5: '2'
## Warning: Coercing text to numeric in E1016 / R1016C5: '2'
## Warning: Coercing text to numeric in E1017 / R1017C5: '2'
## Warning: Coercing text to numeric in E1018 / R1018C5: '2'
## Warning: Coercing text to numeric in E1019 / R1019C5: '2'
## Warning: Coercing text to numeric in E1020 / R1020C5: '2'
## Warning: Coercing text to numeric in E1021 / R1021C5: '2'
## Warning: Coercing text to numeric in E1022 / R1022C5: '2'
## Warning: Coercing text to numeric in E1023 / R1023C5: '2'
## Warning: Coercing text to numeric in E1024 / R1024C5: '2'
## Warning: Coercing text to numeric in E1025 / R1025C5: '2'
## Warning: Coercing text to numeric in E1026 / R1026C5: '2'
## Warning: Coercing text to numeric in E1027 / R1027C5: '2'
## Warning: Coercing text to numeric in E1028 / R1028C5: '2'
## Warning: Coercing text to numeric in E1029 / R1029C5: '2'
## Warning: Coercing text to numeric in E1030 / R1030C5: '2'
## Warning: Coercing text to numeric in E1031 / R1031C5: '2'
## Warning: Coercing text to numeric in E1032 / R1032C5: '2'
## Warning: Coercing text to numeric in E1033 / R1033C5: '2'
## Warning: Coercing text to numeric in E1034 / R1034C5: '2'
## Warning: Coercing text to numeric in E1035 / R1035C5: '2'
## Warning: Coercing text to numeric in E1036 / R1036C5: '2'
## Warning: Coercing text to numeric in E1037 / R1037C5: '2'
## Warning: Coercing text to numeric in E1038 / R1038C5: '2'
## Warning: Coercing text to numeric in E1039 / R1039C5: '2'
## Warning: Coercing text to numeric in E1040 / R1040C5: '2'
## Warning: Coercing text to numeric in E1041 / R1041C5: '2'
## Warning: Coercing text to numeric in E1042 / R1042C5: '2'
## Warning: Coercing text to numeric in E1043 / R1043C5: '2'
## Warning: Coercing text to numeric in E1044 / R1044C5: '2'
## Warning: Coercing text to numeric in E1045 / R1045C5: '2'
## Warning: Coercing text to numeric in E1046 / R1046C5: '2'
## Warning: Coercing text to numeric in E1047 / R1047C5: '2'
## Warning: Coercing text to numeric in E1048 / R1048C5: '2'
## Warning: Coercing text to numeric in E1049 / R1049C5: '2'
## Warning: Coercing text to numeric in E1050 / R1050C5: '2'
## Warning: Coercing text to numeric in E1051 / R1051C5: '2'
## Warning: Coercing text to numeric in E1052 / R1052C5: '2'
## Warning: Coercing text to numeric in E1053 / R1053C5: '2'
## Warning: Coercing text to numeric in E1054 / R1054C5: '2'
## Warning: Coercing text to numeric in E1055 / R1055C5: '2'
## Warning: Coercing text to numeric in E1056 / R1056C5: '2'
## Warning: Coercing text to numeric in E1057 / R1057C5: '2'
## Warning: Coercing text to numeric in E1058 / R1058C5: '1'
## Warning: Coercing text to numeric in E1059 / R1059C5: '1'
## Warning: Coercing text to numeric in E1060 / R1060C5: '1'
## Warning: Coercing text to numeric in E1061 / R1061C5: '1'
## Warning: Coercing text to numeric in E1062 / R1062C5: '1'
## Warning: Coercing text to numeric in E1063 / R1063C5: '1'
## Warning: Coercing text to numeric in E1064 / R1064C5: '1'
## Warning: Coercing text to numeric in E1065 / R1065C5: '1'
## Warning: Coercing text to numeric in E1066 / R1066C5: '1'
## Warning: Coercing text to numeric in E1067 / R1067C5: '1'
## Warning: Coercing text to numeric in E1068 / R1068C5: '1'
## Warning: Coercing text to numeric in E1069 / R1069C5: '1'
## Warning: Coercing text to numeric in E1070 / R1070C5: '1'
## Warning: Coercing text to numeric in E1071 / R1071C5: '1'
## Warning: Coercing text to numeric in E1072 / R1072C5: '1'
## Warning: Coercing text to numeric in E1073 / R1073C5: '1'
## Warning: Coercing text to numeric in E1074 / R1074C5: '1'
## Warning: Coercing text to numeric in E1075 / R1075C5: '1'
## Warning: Coercing text to numeric in E1076 / R1076C5: '1'
## Warning: Coercing text to numeric in E1077 / R1077C5: '1'
## Warning: Coercing text to numeric in E1078 / R1078C5: '1'
## Warning: Coercing text to numeric in E1079 / R1079C5: '1'
## Warning: Coercing text to numeric in E1080 / R1080C5: '1'
## Warning: Coercing text to numeric in E1081 / R1081C5: '1'
## Warning: Coercing text to numeric in E1082 / R1082C5: '1'
## Warning: Coercing text to numeric in E1083 / R1083C5: '1'
## Warning: Coercing text to numeric in E1084 / R1084C5: '1'
## Warning: Coercing text to numeric in E1085 / R1085C5: '1'
## Warning: Coercing text to numeric in E1086 / R1086C5: '1'
## Warning: Coercing text to numeric in E1087 / R1087C5: '1'
## Warning: Coercing text to numeric in E1088 / R1088C5: '1'
## Warning: Coercing text to numeric in E1089 / R1089C5: '1'
## Warning: Coercing text to numeric in E1090 / R1090C5: '1'
## Warning: Coercing text to numeric in E1091 / R1091C5: '1'
## Warning: Coercing text to numeric in E1092 / R1092C5: '1'
## Warning: Coercing text to numeric in E1093 / R1093C5: '1'
## Warning: Coercing text to numeric in E1094 / R1094C5: '1'
## Warning: Coercing text to numeric in E1095 / R1095C5: '1'
## Warning: Coercing text to numeric in E1096 / R1096C5: '1'
## Warning: Coercing text to numeric in E1097 / R1097C5: '1'
## Warning: Coercing text to numeric in E1098 / R1098C5: '1'
## Warning: Coercing text to numeric in E1099 / R1099C5: '1'
## Warning: Coercing text to numeric in E1100 / R1100C5: '1'
## Warning: Coercing text to numeric in E1101 / R1101C5: '1'
## Warning: Coercing text to numeric in E1102 / R1102C5: '1'
## Warning: Coercing text to numeric in E1103 / R1103C5: '1'
## Warning: Coercing text to numeric in E1104 / R1104C5: '1'
## Warning: Coercing text to numeric in E1105 / R1105C5: '1'
## Warning: Coercing text to numeric in E1106 / R1106C5: '1'
## Warning: Coercing text to numeric in E1107 / R1107C5: '1'
## Warning: Coercing text to numeric in E1108 / R1108C5: '1'
## Warning: Coercing text to numeric in E1109 / R1109C5: '1'
## Warning: Coercing text to numeric in E1110 / R1110C5: '1'
## Warning: Coercing text to numeric in E1111 / R1111C5: '1'
## Warning: Coercing text to numeric in E1112 / R1112C5: '2'
## Warning: Coercing text to numeric in E1113 / R1113C5: '2'
## Warning: Coercing text to numeric in E1114 / R1114C5: '2'
## Warning: Coercing text to numeric in E1115 / R1115C5: '2'
## Warning: Coercing text to numeric in E1116 / R1116C5: '2'
## Warning: Coercing text to numeric in E1117 / R1117C5: '2'
## Warning: Coercing text to numeric in E1118 / R1118C5: '2'
## Warning: Coercing text to numeric in E1119 / R1119C5: '2'
## Warning: Coercing text to numeric in E1120 / R1120C5: '2'
## Warning: Coercing text to numeric in E1121 / R1121C5: '2'
## Warning: Coercing text to numeric in E1122 / R1122C5: '2'
## Warning: Coercing text to numeric in E1123 / R1123C5: '2'
## Warning: Coercing text to numeric in E1124 / R1124C5: '2'
## Warning: Coercing text to numeric in E1125 / R1125C5: '2'
## Warning: Coercing text to numeric in E1126 / R1126C5: '2'
## Warning: Coercing text to numeric in E1127 / R1127C5: '2'
## Warning: Coercing text to numeric in E1128 / R1128C5: '2'
## Warning: Coercing text to numeric in E1129 / R1129C5: '2'
## Warning: Coercing text to numeric in E1130 / R1130C5: '1'
## Warning: Coercing text to numeric in E1131 / R1131C5: '1'
## Warning: Coercing text to numeric in E1132 / R1132C5: '1'
## Warning: Coercing text to numeric in E1133 / R1133C5: '1'
## Warning: Coercing text to numeric in E1134 / R1134C5: '1'
## Warning: Coercing text to numeric in E1135 / R1135C5: '1'
## Warning: Coercing text to numeric in E1136 / R1136C5: '2'
## Warning: Coercing text to numeric in E1137 / R1137C5: '2'
## Warning: Coercing text to numeric in E1138 / R1138C5: '2'
## Warning: Coercing text to numeric in E1139 / R1139C5: '2'
## Warning: Coercing text to numeric in E1140 / R1140C5: '2'
## Warning: Coercing text to numeric in E1141 / R1141C5: '2'
## Warning: Coercing text to numeric in E1142 / R1142C5: '1'
## Warning: Coercing text to numeric in E1143 / R1143C5: '1'
## Warning: Coercing text to numeric in E1144 / R1144C5: '1'
## Warning: Coercing text to numeric in E1145 / R1145C5: '1'
## Warning: Coercing text to numeric in E1146 / R1146C5: '1'
## Warning: Coercing text to numeric in E1147 / R1147C5: '1'
## Warning: Coercing text to numeric in E1148 / R1148C5: '1'
## Warning: Coercing text to numeric in E1149 / R1149C5: '1'
## Warning: Coercing text to numeric in E1150 / R1150C5: '1'
## Warning: Coercing text to numeric in E1151 / R1151C5: '1'
## Warning: Coercing text to numeric in E1152 / R1152C5: '1'
## Warning: Coercing text to numeric in E1153 / R1153C5: '1'
## Warning: Coercing text to numeric in E1154 / R1154C5: '2'
## Warning: Coercing text to numeric in E1155 / R1155C5: '2'
## Warning: Coercing text to numeric in E1156 / R1156C5: '2'
## Warning: Coercing text to numeric in E1157 / R1157C5: '2'
## Warning: Coercing text to numeric in E1158 / R1158C5: '2'
## Warning: Coercing text to numeric in E1159 / R1159C5: '2'
## Warning: Coercing text to numeric in E1160 / R1160C5: '2'
## Warning: Coercing text to numeric in E1161 / R1161C5: '2'
## Warning: Coercing text to numeric in E1162 / R1162C5: '2'
## Warning: Coercing text to numeric in E1163 / R1163C5: '2'
## Warning: Coercing text to numeric in E1164 / R1164C5: '2'
## Warning: Coercing text to numeric in E1165 / R1165C5: '2'
## Warning: Coercing text to numeric in E1166 / R1166C5: '2'
## Warning: Coercing text to numeric in E1167 / R1167C5: '2'
## Warning: Coercing text to numeric in E1168 / R1168C5: '2'
## Warning: Coercing text to numeric in E1169 / R1169C5: '2'
## Warning: Coercing text to numeric in E1170 / R1170C5: '2'
## Warning: Coercing text to numeric in E1171 / R1171C5: '2'
## Warning: Coercing text to numeric in E1172 / R1172C5: '1'
## Warning: Coercing text to numeric in E1173 / R1173C5: '1'
## Warning: Coercing text to numeric in E1174 / R1174C5: '1'
## Warning: Coercing text to numeric in E1175 / R1175C5: '1'
## Warning: Coercing text to numeric in E1176 / R1176C5: '1'
## Warning: Coercing text to numeric in E1177 / R1177C5: '1'
## Warning: Coercing text to numeric in E1178 / R1178C5: '1'
## Warning: Coercing text to numeric in E1179 / R1179C5: '1'
## Warning: Coercing text to numeric in E1180 / R1180C5: '1'
## Warning: Coercing text to numeric in E1181 / R1181C5: '1'
## Warning: Coercing text to numeric in E1182 / R1182C5: '1'
## Warning: Coercing text to numeric in E1183 / R1183C5: '1'
## Warning: Coercing text to numeric in E1184 / R1184C5: '2'
## Warning: Coercing text to numeric in E1185 / R1185C5: '2'
## Warning: Coercing text to numeric in E1186 / R1186C5: '2'
## Warning: Coercing text to numeric in E1187 / R1187C5: '2'
## Warning: Coercing text to numeric in E1188 / R1188C5: '2'
## Warning: Coercing text to numeric in E1189 / R1189C5: '2'
## Warning: Coercing text to numeric in E1190 / R1190C5: '1'
## Warning: Coercing text to numeric in E1191 / R1191C5: '1'
## Warning: Coercing text to numeric in E1192 / R1192C5: '1'
## Warning: Coercing text to numeric in E1193 / R1193C5: '1'
## Warning: Coercing text to numeric in E1194 / R1194C5: '1'
## Warning: Coercing text to numeric in E1195 / R1195C5: '1'
## Warning: Coercing text to numeric in E1196 / R1196C5: '2'
## Warning: Coercing text to numeric in E1197 / R1197C5: '2'
## Warning: Coercing text to numeric in E1198 / R1198C5: '2'
## Warning: Coercing text to numeric in E1199 / R1199C5: '2'
## Warning: Coercing text to numeric in E1200 / R1200C5: '2'
## Warning: Coercing text to numeric in E1201 / R1201C5: '2'
## Warning: Coercing text to numeric in E1202 / R1202C5: '2'
## Warning: Coercing text to numeric in E1203 / R1203C5: '2'
## Warning: Coercing text to numeric in E1204 / R1204C5: '2'
## Warning: Coercing text to numeric in E1205 / R1205C5: '2'
## Warning: Coercing text to numeric in E1206 / R1206C5: '2'
## Warning: Coercing text to numeric in E1207 / R1207C5: '2'
## Warning: Coercing text to numeric in E1208 / R1208C5: '1'
## Warning: Coercing text to numeric in E1209 / R1209C5: '1'
## Warning: Coercing text to numeric in E1210 / R1210C5: '1'
## Warning: Coercing text to numeric in E1211 / R1211C5: '1'
## Warning: Coercing text to numeric in E1212 / R1212C5: '1'
## Warning: Coercing text to numeric in E1213 / R1213C5: '1'
## Warning: Coercing text to numeric in E1214 / R1214C5: '2'
## Warning: Coercing text to numeric in E1215 / R1215C5: '2'
## Warning: Coercing text to numeric in E1216 / R1216C5: '2'
## Warning: Coercing text to numeric in E1217 / R1217C5: '2'
## Warning: Coercing text to numeric in E1218 / R1218C5: '2'
## Warning: Coercing text to numeric in E1219 / R1219C5: '2'
## Warning: Coercing text to numeric in E1220 / R1220C5: '1'
## Warning: Coercing text to numeric in E1221 / R1221C5: '1'
## Warning: Coercing text to numeric in E1222 / R1222C5: '1'
## Warning: Coercing text to numeric in E1223 / R1223C5: '1'
## Warning: Coercing text to numeric in E1224 / R1224C5: '1'
## Warning: Coercing text to numeric in E1225 / R1225C5: '1'
## Warning: Coercing text to numeric in E1226 / R1226C5: '2'
## Warning: Coercing text to numeric in E1227 / R1227C5: '2'
## Warning: Coercing text to numeric in E1228 / R1228C5: '2'
## Warning: Coercing text to numeric in E1229 / R1229C5: '2'
## Warning: Coercing text to numeric in E1230 / R1230C5: '2'
## Warning: Coercing text to numeric in E1231 / R1231C5: '2'
## Warning: Coercing text to numeric in E1232 / R1232C5: '1'
## Warning: Coercing text to numeric in E1233 / R1233C5: '1'
## Warning: Coercing text to numeric in E1234 / R1234C5: '1'
## Warning: Coercing text to numeric in E1235 / R1235C5: '1'
## Warning: Coercing text to numeric in E1236 / R1236C5: '1'
## Warning: Coercing text to numeric in E1237 / R1237C5: '1'
## Warning: Coercing text to numeric in E1238 / R1238C5: '1'
## Warning: Coercing text to numeric in E1239 / R1239C5: '1'
## Warning: Coercing text to numeric in E1240 / R1240C5: '1'
## Warning: Coercing text to numeric in E1241 / R1241C5: '1'
## Warning: Coercing text to numeric in E1242 / R1242C5: '1'
## Warning: Coercing text to numeric in E1243 / R1243C5: '1'
## Warning: Coercing text to numeric in E1244 / R1244C5: '1'
## Warning: Coercing text to numeric in E1245 / R1245C5: '1'
## Warning: Coercing text to numeric in E1246 / R1246C5: '1'
## Warning: Coercing text to numeric in E1247 / R1247C5: '1'
## Warning: Coercing text to numeric in E1248 / R1248C5: '1'
## Warning: Coercing text to numeric in E1249 / R1249C5: '1'
## Warning: Coercing text to numeric in E1250 / R1250C5: '2'
## Warning: Coercing text to numeric in E1251 / R1251C5: '2'
## Warning: Coercing text to numeric in E1252 / R1252C5: '2'
## Warning: Coercing text to numeric in E1253 / R1253C5: '2'
## Warning: Coercing text to numeric in E1254 / R1254C5: '2'
## Warning: Coercing text to numeric in E1255 / R1255C5: '2'
## Warning: Coercing text to numeric in E1256 / R1256C5: '1'
## Warning: Coercing text to numeric in E1257 / R1257C5: '1'
## Warning: Coercing text to numeric in E1258 / R1258C5: '1'
## Warning: Coercing text to numeric in E1259 / R1259C5: '1'
## Warning: Coercing text to numeric in E1260 / R1260C5: '1'
## Warning: Coercing text to numeric in E1261 / R1261C5: '1'
## Warning: Coercing text to numeric in E1262 / R1262C5: '1'
## Warning: Coercing text to numeric in E1263 / R1263C5: '1'
## Warning: Coercing text to numeric in E1264 / R1264C5: '1'
## Warning: Coercing text to numeric in E1265 / R1265C5: '1'
## Warning: Coercing text to numeric in E1266 / R1266C5: '1'
## Warning: Coercing text to numeric in E1267 / R1267C5: '1'
## Warning: Coercing text to numeric in E1268 / R1268C5: '2'
## Warning: Coercing text to numeric in E1269 / R1269C5: '2'
## Warning: Coercing text to numeric in E1270 / R1270C5: '2'
## Warning: Coercing text to numeric in E1271 / R1271C5: '2'
## Warning: Coercing text to numeric in E1272 / R1272C5: '2'
## Warning: Coercing text to numeric in E1273 / R1273C5: '2'
## Warning: Coercing text to numeric in E1274 / R1274C5: '2'
## Warning: Coercing text to numeric in E1275 / R1275C5: '2'
## Warning: Coercing text to numeric in E1276 / R1276C5: '2'
## Warning: Coercing text to numeric in E1277 / R1277C5: '2'
## Warning: Coercing text to numeric in E1278 / R1278C5: '2'
## Warning: Coercing text to numeric in E1279 / R1279C5: '2'
## Warning: Coercing text to numeric in E1280 / R1280C5: '1'
## Warning: Coercing text to numeric in E1281 / R1281C5: '1'
## Warning: Coercing text to numeric in E1282 / R1282C5: '1'
## Warning: Coercing text to numeric in E1283 / R1283C5: '1'
## Warning: Coercing text to numeric in E1284 / R1284C5: '1'
## Warning: Coercing text to numeric in E1285 / R1285C5: '1'
## Warning: Coercing text to numeric in E1286 / R1286C5: '1'
## Warning: Coercing text to numeric in E1287 / R1287C5: '1'
## Warning: Coercing text to numeric in E1288 / R1288C5: '1'
## Warning: Coercing text to numeric in E1289 / R1289C5: '1'
## Warning: Coercing text to numeric in E1290 / R1290C5: '1'
## Warning: Coercing text to numeric in E1291 / R1291C5: '1'
## Warning: Coercing text to numeric in E1292 / R1292C5: '2'
## Warning: Coercing text to numeric in E1293 / R1293C5: '2'
## Warning: Coercing text to numeric in E1294 / R1294C5: '2'
## Warning: Coercing text to numeric in E1295 / R1295C5: '2'
## Warning: Coercing text to numeric in E1296 / R1296C5: '2'
## Warning: Coercing text to numeric in E1297 / R1297C5: '2'
## Warning: Coercing text to numeric in E1298 / R1298C5: '2'
## Warning: Coercing text to numeric in E1299 / R1299C5: '2'
## Warning: Coercing text to numeric in E1300 / R1300C5: '2'
## Warning: Coercing text to numeric in E1301 / R1301C5: '2'
## Warning: Coercing text to numeric in E1302 / R1302C5: '2'
## Warning: Coercing text to numeric in E1303 / R1303C5: '2'
## Warning: Coercing text to numeric in E1304 / R1304C5: '1'
## Warning: Coercing text to numeric in E1305 / R1305C5: '1'
## Warning: Coercing text to numeric in E1306 / R1306C5: '1'
## Warning: Coercing text to numeric in E1307 / R1307C5: '1'
## Warning: Coercing text to numeric in E1308 / R1308C5: '1'
## Warning: Coercing text to numeric in E1309 / R1309C5: '1'
## Warning: Coercing text to numeric in E1310 / R1310C5: '2'
## Warning: Coercing text to numeric in E1311 / R1311C5: '2'
## Warning: Coercing text to numeric in E1312 / R1312C5: '2'
## Warning: Coercing text to numeric in E1313 / R1313C5: '2'
## Warning: Coercing text to numeric in E1314 / R1314C5: '2'
## Warning: Coercing text to numeric in E1315 / R1315C5: '2'
## Warning: Coercing text to numeric in E1316 / R1316C5: '1'
## Warning: Coercing text to numeric in E1317 / R1317C5: '1'
## Warning: Coercing text to numeric in E1318 / R1318C5: '1'
## Warning: Coercing text to numeric in E1319 / R1319C5: '1'
## Warning: Coercing text to numeric in E1320 / R1320C5: '1'
## Warning: Coercing text to numeric in E1321 / R1321C5: '1'
## Warning: Coercing text to numeric in E1322 / R1322C5: '1'
## Warning: Coercing text to numeric in E1323 / R1323C5: '1'
## Warning: Coercing text to numeric in E1324 / R1324C5: '1'
## Warning: Coercing text to numeric in E1325 / R1325C5: '1'
## Warning: Coercing text to numeric in E1326 / R1326C5: '1'
## Warning: Coercing text to numeric in E1327 / R1327C5: '1'
## Warning: Coercing text to numeric in E1328 / R1328C5: '2'
## Warning: Coercing text to numeric in E1329 / R1329C5: '2'
## Warning: Coercing text to numeric in E1330 / R1330C5: '2'
## Warning: Coercing text to numeric in E1331 / R1331C5: '2'
## Warning: Coercing text to numeric in E1332 / R1332C5: '2'
## Warning: Coercing text to numeric in E1333 / R1333C5: '2'
## Warning: Coercing text to numeric in E1334 / R1334C5: '2'
## Warning: Coercing text to numeric in E1335 / R1335C5: '2'
## Warning: Coercing text to numeric in E1336 / R1336C5: '2'
## Warning: Coercing text to numeric in E1337 / R1337C5: '2'
## Warning: Coercing text to numeric in E1338 / R1338C5: '2'
## Warning: Coercing text to numeric in E1339 / R1339C5: '2'
## Warning: Coercing text to numeric in E1340 / R1340C5: '2'
## Warning: Coercing text to numeric in E1341 / R1341C5: '2'
## Warning: Coercing text to numeric in E1342 / R1342C5: '2'
## Warning: Coercing text to numeric in E1343 / R1343C5: '2'
## Warning: Coercing text to numeric in E1344 / R1344C5: '2'
## Warning: Coercing text to numeric in E1345 / R1345C5: '2'
## Warning: Coercing text to numeric in E1346 / R1346C5: '2'
## Warning: Coercing text to numeric in E1347 / R1347C5: '2'
## Warning: Coercing text to numeric in E1348 / R1348C5: '2'
## Warning: Coercing text to numeric in E1349 / R1349C5: '2'
## Warning: Coercing text to numeric in E1350 / R1350C5: '2'
## Warning: Coercing text to numeric in E1351 / R1351C5: '2'
## Warning: Coercing text to numeric in E1352 / R1352C5: '2'
## Warning: Coercing text to numeric in E1353 / R1353C5: '2'
## Warning: Coercing text to numeric in E1354 / R1354C5: '2'
## Warning: Coercing text to numeric in E1355 / R1355C5: '2'
## Warning: Coercing text to numeric in E1356 / R1356C5: '2'
## Warning: Coercing text to numeric in E1357 / R1357C5: '2'
## Warning: Coercing text to numeric in E1358 / R1358C5: '2'
## Warning: Coercing text to numeric in E1359 / R1359C5: '2'
## Warning: Coercing text to numeric in E1360 / R1360C5: '2'
## Warning: Coercing text to numeric in E1361 / R1361C5: '2'
## Warning: Coercing text to numeric in E1362 / R1362C5: '2'
## Warning: Coercing text to numeric in E1363 / R1363C5: '2'
## Warning: Coercing text to numeric in E1364 / R1364C5: '2'
## Warning: Coercing text to numeric in E1365 / R1365C5: '2'
## Warning: Coercing text to numeric in E1366 / R1366C5: '2'
## Warning: Coercing text to numeric in E1367 / R1367C5: '2'
## Warning: Coercing text to numeric in E1368 / R1368C5: '2'
## Warning: Coercing text to numeric in E1369 / R1369C5: '2'
## Warning: Coercing text to numeric in E1370 / R1370C5: '2'
## Warning: Coercing text to numeric in E1371 / R1371C5: '2'
## Warning: Coercing text to numeric in E1372 / R1372C5: '2'
## Warning: Coercing text to numeric in E1373 / R1373C5: '2'
## Warning: Coercing text to numeric in E1374 / R1374C5: '2'
## Warning: Coercing text to numeric in E1375 / R1375C5: '2'
## Warning: Coercing text to numeric in E1376 / R1376C5: '2'
## Warning: Coercing text to numeric in E1377 / R1377C5: '2'
## Warning: Coercing text to numeric in E1378 / R1378C5: '2'
## Warning: Coercing text to numeric in E1379 / R1379C5: '2'
## Warning: Coercing text to numeric in E1380 / R1380C5: '2'
## Warning: Coercing text to numeric in E1381 / R1381C5: '2'
## Warning: Coercing text to numeric in E1382 / R1382C5: '2'
## Warning: Coercing text to numeric in E1383 / R1383C5: '2'
## Warning: Coercing text to numeric in E1384 / R1384C5: '2'
## Warning: Coercing text to numeric in E1385 / R1385C5: '2'
## Warning: Coercing text to numeric in E1386 / R1386C5: '2'
## Warning: Coercing text to numeric in E1387 / R1387C5: '2'
## Warning: Coercing text to numeric in E1388 / R1388C5: '1'
## Warning: Coercing text to numeric in E1389 / R1389C5: '1'
## Warning: Coercing text to numeric in E1390 / R1390C5: '1'
## Warning: Coercing text to numeric in E1391 / R1391C5: '1'
## Warning: Coercing text to numeric in E1392 / R1392C5: '1'
## Warning: Coercing text to numeric in E1393 / R1393C5: '1'
## Warning: Coercing text to numeric in E1394 / R1394C5: '1'
## Warning: Coercing text to numeric in E1395 / R1395C5: '1'
## Warning: Coercing text to numeric in E1396 / R1396C5: '1'
## Warning: Coercing text to numeric in E1397 / R1397C5: '1'
## Warning: Coercing text to numeric in E1398 / R1398C5: '1'
## Warning: Coercing text to numeric in E1399 / R1399C5: '1'
## Warning: Coercing text to numeric in E1400 / R1400C5: '2'
## Warning: Coercing text to numeric in E1401 / R1401C5: '2'
## Warning: Coercing text to numeric in E1402 / R1402C5: '2'
## Warning: Coercing text to numeric in E1403 / R1403C5: '2'
## Warning: Coercing text to numeric in E1404 / R1404C5: '2'
## Warning: Coercing text to numeric in E1405 / R1405C5: '2'
## Warning: Coercing text to numeric in E1406 / R1406C5: '1'
## Warning: Coercing text to numeric in E1407 / R1407C5: '1'
## Warning: Coercing text to numeric in E1408 / R1408C5: '1'
## Warning: Coercing text to numeric in E1409 / R1409C5: '1'
## Warning: Coercing text to numeric in E1410 / R1410C5: '1'
## Warning: Coercing text to numeric in E1411 / R1411C5: '1'
## Warning: Coercing text to numeric in E1412 / R1412C5: '1'
## Warning: Coercing text to numeric in E1413 / R1413C5: '1'
## Warning: Coercing text to numeric in E1414 / R1414C5: '1'
## Warning: Coercing text to numeric in E1415 / R1415C5: '1'
## Warning: Coercing text to numeric in E1416 / R1416C5: '1'
## Warning: Coercing text to numeric in E1417 / R1417C5: '1'
## Warning: Coercing text to numeric in E1418 / R1418C5: '1'
## Warning: Coercing text to numeric in E1419 / R1419C5: '1'
## Warning: Coercing text to numeric in E1420 / R1420C5: '1'
## Warning: Coercing text to numeric in E1421 / R1421C5: '1'
## Warning: Coercing text to numeric in E1422 / R1422C5: '1'
## Warning: Coercing text to numeric in E1423 / R1423C5: '1'
## Warning: Coercing text to numeric in E1424 / R1424C5: '1'
## Warning: Coercing text to numeric in E1425 / R1425C5: '1'
## Warning: Coercing text to numeric in E1426 / R1426C5: '1'
## Warning: Coercing text to numeric in E1427 / R1427C5: '1'
## Warning: Coercing text to numeric in E1428 / R1428C5: '1'
## Warning: Coercing text to numeric in E1429 / R1429C5: '1'
## Warning: Coercing text to numeric in E1430 / R1430C5: '2'
## Warning: Coercing text to numeric in E1431 / R1431C5: '2'
## Warning: Coercing text to numeric in E1432 / R1432C5: '2'
## Warning: Coercing text to numeric in E1433 / R1433C5: '2'
## Warning: Coercing text to numeric in E1434 / R1434C5: '2'
## Warning: Coercing text to numeric in E1435 / R1435C5: '2'
## Warning: Coercing text to numeric in E1436 / R1436C5: '2'
## Warning: Coercing text to numeric in E1437 / R1437C5: '2'
## Warning: Coercing text to numeric in E1438 / R1438C5: '2'
## Warning: Coercing text to numeric in E1439 / R1439C5: '2'
## Warning: Coercing text to numeric in E1440 / R1440C5: '2'
## Warning: Coercing text to numeric in E1441 / R1441C5: '2'
## Warning: Coercing text to numeric in E1442 / R1442C5: '2'
## Warning: Coercing text to numeric in E1443 / R1443C5: '2'
## Warning: Coercing text to numeric in E1444 / R1444C5: '2'
## Warning: Coercing text to numeric in E1445 / R1445C5: '2'
## Warning: Coercing text to numeric in E1446 / R1446C5: '2'
## Warning: Coercing text to numeric in E1447 / R1447C5: '2'
## Warning: Coercing text to numeric in E1448 / R1448C5: '1'
## Warning: Coercing text to numeric in E1449 / R1449C5: '1'
## Warning: Coercing text to numeric in E1450 / R1450C5: '1'
## Warning: Coercing text to numeric in E1451 / R1451C5: '1'
## Warning: Coercing text to numeric in E1452 / R1452C5: '1'
## Warning: Coercing text to numeric in E1453 / R1453C5: '1'
## Warning: Coercing text to numeric in E1454 / R1454C5: '1'
## Warning: Coercing text to numeric in E1455 / R1455C5: '1'
## Warning: Coercing text to numeric in E1456 / R1456C5: '1'
## Warning: Coercing text to numeric in E1457 / R1457C5: '1'
## Warning: Coercing text to numeric in E1458 / R1458C5: '1'
## Warning: Coercing text to numeric in E1459 / R1459C5: '1'
## Warning: Coercing text to numeric in E1460 / R1460C5: '2'
## Warning: Coercing text to numeric in E1461 / R1461C5: '2'
## Warning: Coercing text to numeric in E1462 / R1462C5: '2'
## Warning: Coercing text to numeric in E1463 / R1463C5: '2'
## Warning: Coercing text to numeric in E1464 / R1464C5: '2'
## Warning: Coercing text to numeric in E1465 / R1465C5: '2'
## Warning: Coercing text to numeric in E1466 / R1466C5: '1'
## Warning: Coercing text to numeric in E1467 / R1467C5: '1'
## Warning: Coercing text to numeric in E1468 / R1468C5: '1'
## Warning: Coercing text to numeric in E1469 / R1469C5: '1'
## Warning: Coercing text to numeric in E1470 / R1470C5: '1'
## Warning: Coercing text to numeric in E1471 / R1471C5: '1'
## Warning: Coercing text to numeric in E1472 / R1472C5: '1'
## Warning: Coercing text to numeric in E1473 / R1473C5: '1'
## Warning: Coercing text to numeric in E1474 / R1474C5: '1'
## Warning: Coercing text to numeric in E1475 / R1475C5: '1'
## Warning: Coercing text to numeric in E1476 / R1476C5: '1'
## Warning: Coercing text to numeric in E1477 / R1477C5: '1'
## Warning: Coercing text to numeric in E1478 / R1478C5: '2'
## Warning: Coercing text to numeric in E1479 / R1479C5: '2'
## Warning: Coercing text to numeric in E1480 / R1480C5: '2'
## Warning: Coercing text to numeric in E1481 / R1481C5: '2'
## Warning: Coercing text to numeric in E1482 / R1482C5: '2'
## Warning: Coercing text to numeric in E1483 / R1483C5: '2'
## Warning: Coercing text to numeric in E1484 / R1484C5: '2'
## Warning: Coercing text to numeric in E1485 / R1485C5: '2'
## Warning: Coercing text to numeric in E1486 / R1486C5: '2'
## Warning: Coercing text to numeric in E1487 / R1487C5: '2'
## Warning: Coercing text to numeric in E1488 / R1488C5: '2'
## Warning: Coercing text to numeric in E1489 / R1489C5: '2'
## Warning: Coercing text to numeric in E1490 / R1490C5: '2'
## Warning: Coercing text to numeric in E1491 / R1491C5: '2'
## Warning: Coercing text to numeric in E1492 / R1492C5: '2'
## Warning: Coercing text to numeric in E1493 / R1493C5: '2'
## Warning: Coercing text to numeric in E1494 / R1494C5: '2'
## Warning: Coercing text to numeric in E1495 / R1495C5: '2'
## Warning: Coercing text to numeric in E1496 / R1496C5: '2'
## Warning: Coercing text to numeric in E1497 / R1497C5: '2'
## Warning: Coercing text to numeric in E1498 / R1498C5: '2'
## Warning: Coercing text to numeric in E1499 / R1499C5: '2'
## Warning: Coercing text to numeric in E1500 / R1500C5: '2'
## Warning: Coercing text to numeric in E1501 / R1501C5: '2'
## Warning: Coercing text to numeric in E1502 / R1502C5: '2'
## Warning: Coercing text to numeric in E1503 / R1503C5: '2'
## Warning: Coercing text to numeric in E1504 / R1504C5: '2'
## Warning: Coercing text to numeric in E1505 / R1505C5: '2'
## Warning: Coercing text to numeric in E1506 / R1506C5: '2'
## Warning: Coercing text to numeric in E1507 / R1507C5: '2'
## Warning: Coercing text to numeric in E1508 / R1508C5: '2'
## Warning: Coercing text to numeric in E1509 / R1509C5: '2'
## Warning: Coercing text to numeric in E1510 / R1510C5: '2'
## Warning: Coercing text to numeric in E1511 / R1511C5: '2'
## Warning: Coercing text to numeric in E1512 / R1512C5: '2'
## Warning: Coercing text to numeric in E1513 / R1513C5: '2'
## Warning: Coercing text to numeric in E1514 / R1514C5: '1'
## Warning: Coercing text to numeric in E1515 / R1515C5: '1'
## Warning: Coercing text to numeric in E1516 / R1516C5: '1'
## Warning: Coercing text to numeric in E1517 / R1517C5: '1'
## Warning: Coercing text to numeric in E1518 / R1518C5: '1'
## Warning: Coercing text to numeric in E1519 / R1519C5: '1'
## Warning: Coercing text to numeric in E1520 / R1520C5: '1'
## Warning: Coercing text to numeric in E1521 / R1521C5: '1'
## Warning: Coercing text to numeric in E1522 / R1522C5: '1'
## Warning: Coercing text to numeric in E1523 / R1523C5: '1'
## Warning: Coercing text to numeric in E1524 / R1524C5: '1'
## Warning: Coercing text to numeric in E1525 / R1525C5: '1'
## Warning: Coercing text to numeric in E1526 / R1526C5: '1'
## Warning: Coercing text to numeric in E1527 / R1527C5: '1'
## Warning: Coercing text to numeric in E1528 / R1528C5: '1'
## Warning: Coercing text to numeric in E1529 / R1529C5: '1'
## Warning: Coercing text to numeric in E1530 / R1530C5: '1'
## Warning: Coercing text to numeric in E1531 / R1531C5: '1'
## Warning: Coercing text to numeric in E1532 / R1532C5: '1'
## Warning: Coercing text to numeric in E1533 / R1533C5: '1'
## Warning: Coercing text to numeric in E1534 / R1534C5: '1'
## Warning: Coercing text to numeric in E1535 / R1535C5: '1'
## Warning: Coercing text to numeric in E1536 / R1536C5: '1'
## Warning: Coercing text to numeric in E1537 / R1537C5: '1'
## Warning: Coercing text to numeric in E1538 / R1538C5: '2'
## Warning: Coercing text to numeric in E1539 / R1539C5: '2'
## Warning: Coercing text to numeric in E1540 / R1540C5: '2'
## Warning: Coercing text to numeric in E1541 / R1541C5: '2'
## Warning: Coercing text to numeric in E1542 / R1542C5: '2'
## Warning: Coercing text to numeric in E1543 / R1543C5: '2'
## Warning: Coercing text to numeric in E1544 / R1544C5: '1'
## Warning: Coercing text to numeric in E1545 / R1545C5: '1'
## Warning: Coercing text to numeric in E1546 / R1546C5: '1'
## Warning: Coercing text to numeric in E1547 / R1547C5: '1'
## Warning: Coercing text to numeric in E1548 / R1548C5: '1'
## Warning: Coercing text to numeric in E1549 / R1549C5: '1'
## Warning: Coercing text to numeric in E1550 / R1550C5: '2'
## Warning: Coercing text to numeric in E1551 / R1551C5: '2'
## Warning: Coercing text to numeric in E1552 / R1552C5: '2'
## Warning: Coercing text to numeric in E1553 / R1553C5: '2'
## Warning: Coercing text to numeric in E1554 / R1554C5: '2'
## Warning: Coercing text to numeric in E1555 / R1555C5: '2'
## Warning: Coercing text to numeric in E1556 / R1556C5: '1'
## Warning: Coercing text to numeric in E1557 / R1557C5: '1'
## Warning: Coercing text to numeric in E1558 / R1558C5: '1'
## Warning: Coercing text to numeric in E1559 / R1559C5: '1'
## Warning: Coercing text to numeric in E1560 / R1560C5: '1'
## Warning: Coercing text to numeric in E1561 / R1561C5: '1'
## Warning: Coercing text to numeric in E1562 / R1562C5: '1'
## Warning: Coercing text to numeric in E1563 / R1563C5: '1'
## Warning: Coercing text to numeric in E1564 / R1564C5: '1'
## Warning: Coercing text to numeric in E1565 / R1565C5: '1'
## Warning: Coercing text to numeric in E1566 / R1566C5: '1'
## Warning: Coercing text to numeric in E1567 / R1567C5: '1'
## Warning: Coercing text to numeric in E1568 / R1568C5: '2'
## Warning: Coercing text to numeric in E1569 / R1569C5: '2'
## Warning: Coercing text to numeric in E1570 / R1570C5: '2'
## Warning: Coercing text to numeric in E1571 / R1571C5: '2'
## Warning: Coercing text to numeric in E1572 / R1572C5: '2'
## Warning: Coercing text to numeric in E1573 / R1573C5: '2'
## Warning: Coercing text to numeric in E1574 / R1574C5: '1'
## Warning: Coercing text to numeric in E1575 / R1575C5: '1'
## Warning: Coercing text to numeric in E1576 / R1576C5: '1'
## Warning: Coercing text to numeric in E1577 / R1577C5: '1'
## Warning: Coercing text to numeric in E1578 / R1578C5: '1'
## Warning: Coercing text to numeric in E1579 / R1579C5: '1'
## Warning: Coercing text to numeric in E1580 / R1580C5: '1'
## Warning: Coercing text to numeric in E1581 / R1581C5: '1'
## Warning: Coercing text to numeric in E1582 / R1582C5: '1'
## Warning: Coercing text to numeric in E1583 / R1583C5: '1'
## Warning: Coercing text to numeric in E1584 / R1584C5: '1'
## Warning: Coercing text to numeric in E1585 / R1585C5: '1'
## Warning: Coercing text to numeric in E1586 / R1586C5: '1'
## Warning: Coercing text to numeric in E1587 / R1587C5: '1'
## Warning: Coercing text to numeric in E1588 / R1588C5: '1'
## Warning: Coercing text to numeric in E1589 / R1589C5: '1'
## Warning: Coercing text to numeric in E1590 / R1590C5: '1'
## Warning: Coercing text to numeric in E1591 / R1591C5: '1'
## Warning: Coercing text to numeric in E1592 / R1592C5: '1'
## Warning: Coercing text to numeric in E1593 / R1593C5: '1'
## Warning: Coercing text to numeric in E1594 / R1594C5: '1'
## Warning: Coercing text to numeric in E1595 / R1595C5: '1'
## Warning: Coercing text to numeric in E1596 / R1596C5: '1'
## Warning: Coercing text to numeric in E1597 / R1597C5: '1'
## Warning: Coercing text to numeric in E1598 / R1598C5: '2'
## Warning: Coercing text to numeric in E1599 / R1599C5: '2'
## Warning: Coercing text to numeric in E1600 / R1600C5: '2'
## Warning: Coercing text to numeric in E1601 / R1601C5: '2'
## Warning: Coercing text to numeric in E1602 / R1602C5: '2'
## Warning: Coercing text to numeric in E1603 / R1603C5: '2'
## Warning: Coercing text to numeric in E1604 / R1604C5: '2'
## Warning: Coercing text to numeric in E1605 / R1605C5: '2'
## Warning: Coercing text to numeric in E1606 / R1606C5: '2'
## Warning: Coercing text to numeric in E1607 / R1607C5: '2'
## Warning: Coercing text to numeric in E1608 / R1608C5: '2'
## Warning: Coercing text to numeric in E1609 / R1609C5: '2'
## Warning: Coercing text to numeric in E1610 / R1610C5: '2'
## Warning: Coercing text to numeric in E1611 / R1611C5: '2'
## Warning: Coercing text to numeric in E1612 / R1612C5: '2'
## Warning: Coercing text to numeric in E1613 / R1613C5: '2'
## Warning: Coercing text to numeric in E1614 / R1614C5: '2'
## Warning: Coercing text to numeric in E1615 / R1615C5: '2'
## Warning: Coercing text to numeric in E1616 / R1616C5: '2'
## Warning: Coercing text to numeric in E1617 / R1617C5: '2'
## Warning: Coercing text to numeric in E1618 / R1618C5: '2'
## Warning: Coercing text to numeric in E1619 / R1619C5: '2'
## Warning: Coercing text to numeric in E1620 / R1620C5: '2'
## Warning: Coercing text to numeric in E1621 / R1621C5: '2'
## Warning: Coercing text to numeric in E1622 / R1622C5: '2'
## Warning: Coercing text to numeric in E1623 / R1623C5: '2'
## Warning: Coercing text to numeric in E1624 / R1624C5: '2'
## Warning: Coercing text to numeric in E1625 / R1625C5: '2'
## Warning: Coercing text to numeric in E1626 / R1626C5: '2'
## Warning: Coercing text to numeric in E1627 / R1627C5: '2'
## Warning: Coercing text to numeric in E1628 / R1628C5: '2'
## Warning: Coercing text to numeric in E1629 / R1629C5: '2'
## Warning: Coercing text to numeric in E1630 / R1630C5: '2'
## Warning: Coercing text to numeric in E1631 / R1631C5: '2'
## Warning: Coercing text to numeric in E1632 / R1632C5: '2'
## Warning: Coercing text to numeric in E1633 / R1633C5: '2'
## Warning: Coercing text to numeric in E1634 / R1634C5: '1'
## Warning: Coercing text to numeric in E1635 / R1635C5: '1'
## Warning: Coercing text to numeric in E1636 / R1636C5: '1'
## Warning: Coercing text to numeric in E1637 / R1637C5: '1'
## Warning: Coercing text to numeric in E1638 / R1638C5: '1'
## Warning: Coercing text to numeric in E1639 / R1639C5: '1'
## Warning: Coercing text to numeric in E1640 / R1640C5: '2'
## Warning: Coercing text to numeric in E1641 / R1641C5: '2'
## Warning: Coercing text to numeric in E1642 / R1642C5: '2'
## Warning: Coercing text to numeric in E1643 / R1643C5: '2'
## Warning: Coercing text to numeric in E1644 / R1644C5: '2'
## Warning: Coercing text to numeric in E1645 / R1645C5: '2'
## Warning: Coercing text to numeric in E1646 / R1646C5: '1'
## Warning: Coercing text to numeric in E1647 / R1647C5: '1'
## Warning: Coercing text to numeric in E1648 / R1648C5: '1'
## Warning: Coercing text to numeric in E1649 / R1649C5: '1'
## Warning: Coercing text to numeric in E1650 / R1650C5: '1'
## Warning: Coercing text to numeric in E1651 / R1651C5: '1'
## Warning: Coercing text to numeric in E1652 / R1652C5: '2'
## Warning: Coercing text to numeric in E1653 / R1653C5: '2'
## Warning: Coercing text to numeric in E1654 / R1654C5: '2'
## Warning: Coercing text to numeric in E1655 / R1655C5: '2'
## Warning: Coercing text to numeric in E1656 / R1656C5: '2'
## Warning: Coercing text to numeric in E1657 / R1657C5: '2'
## Warning: Coercing text to numeric in E1658 / R1658C5: '1'
## Warning: Coercing text to numeric in E1659 / R1659C5: '1'
## Warning: Coercing text to numeric in E1660 / R1660C5: '1'
## Warning: Coercing text to numeric in E1661 / R1661C5: '1'
## Warning: Coercing text to numeric in E1662 / R1662C5: '1'
## Warning: Coercing text to numeric in E1663 / R1663C5: '1'
## Warning: Coercing text to numeric in E1664 / R1664C5: '1'
## Warning: Coercing text to numeric in E1665 / R1665C5: '1'
## Warning: Coercing text to numeric in E1666 / R1666C5: '1'
## Warning: Coercing text to numeric in E1667 / R1667C5: '1'
## Warning: Coercing text to numeric in E1668 / R1668C5: '1'
## Warning: Coercing text to numeric in E1669 / R1669C5: '1'
## Warning: Coercing text to numeric in E1670 / R1670C5: '2'
## Warning: Coercing text to numeric in E1671 / R1671C5: '2'
## Warning: Coercing text to numeric in E1672 / R1672C5: '2'
## Warning: Coercing text to numeric in E1673 / R1673C5: '2'
## Warning: Coercing text to numeric in E1674 / R1674C5: '2'
## Warning: Coercing text to numeric in E1675 / R1675C5: '2'
## Warning: Coercing text to numeric in E1676 / R1676C5: '1'
## Warning: Coercing text to numeric in E1677 / R1677C5: '1'
## Warning: Coercing text to numeric in E1678 / R1678C5: '1'
## Warning: Coercing text to numeric in E1679 / R1679C5: '1'
## Warning: Coercing text to numeric in E1680 / R1680C5: '1'
## Warning: Coercing text to numeric in E1681 / R1681C5: '1'
## Warning: Coercing text to numeric in E1682 / R1682C5: '1'
## Warning: Coercing text to numeric in E1683 / R1683C5: '1'
## Warning: Coercing text to numeric in E1684 / R1684C5: '1'
## Warning: Coercing text to numeric in E1685 / R1685C5: '1'
## Warning: Coercing text to numeric in E1686 / R1686C5: '1'
## Warning: Coercing text to numeric in E1687 / R1687C5: '1'
## Warning: Coercing text to numeric in E1688 / R1688C5: '2'
## Warning: Coercing text to numeric in E1689 / R1689C5: '2'
## Warning: Coercing text to numeric in E1690 / R1690C5: '2'
## Warning: Coercing text to numeric in E1691 / R1691C5: '2'
## Warning: Coercing text to numeric in E1692 / R1692C5: '2'
## Warning: Coercing text to numeric in E1693 / R1693C5: '2'
## Warning: Coercing text to numeric in E1694 / R1694C5: '2'
## Warning: Coercing text to numeric in E1695 / R1695C5: '2'
## Warning: Coercing text to numeric in E1696 / R1696C5: '2'
## Warning: Coercing text to numeric in E1697 / R1697C5: '2'
## Warning: Coercing text to numeric in E1698 / R1698C5: '2'
## Warning: Coercing text to numeric in E1699 / R1699C5: '2'
## Warning: Coercing text to numeric in E1700 / R1700C5: '2'
## Warning: Coercing text to numeric in E1701 / R1701C5: '2'
## Warning: Coercing text to numeric in E1702 / R1702C5: '2'
## Warning: Coercing text to numeric in E1703 / R1703C5: '2'
## Warning: Coercing text to numeric in E1704 / R1704C5: '2'
## Warning: Coercing text to numeric in E1705 / R1705C5: '2'
## Warning: Coercing text to numeric in E1706 / R1706C5: '2'
## Warning: Coercing text to numeric in E1707 / R1707C5: '2'
## Warning: Coercing text to numeric in E1708 / R1708C5: '2'
## Warning: Coercing text to numeric in E1709 / R1709C5: '2'
## Warning: Coercing text to numeric in E1710 / R1710C5: '2'
## Warning: Coercing text to numeric in E1711 / R1711C5: '2'
## Warning: Coercing text to numeric in E1712 / R1712C5: '2'
## Warning: Coercing text to numeric in E1713 / R1713C5: '2'
## Warning: Coercing text to numeric in E1714 / R1714C5: '2'
## Warning: Coercing text to numeric in E1715 / R1715C5: '2'
## Warning: Coercing text to numeric in E1716 / R1716C5: '2'
## Warning: Coercing text to numeric in E1717 / R1717C5: '2'
## Warning: Coercing text to numeric in E1718 / R1718C5: '1'
## Warning: Coercing text to numeric in E1719 / R1719C5: '1'
## Warning: Coercing text to numeric in E1720 / R1720C5: '1'
## Warning: Coercing text to numeric in E1721 / R1721C5: '1'
## Warning: Coercing text to numeric in E1722 / R1722C5: '1'
## Warning: Coercing text to numeric in E1723 / R1723C5: '1'
## Warning: Coercing text to numeric in E1724 / R1724C5: '1'
## Warning: Coercing text to numeric in E1725 / R1725C5: '1'
## Warning: Coercing text to numeric in E1726 / R1726C5: '1'
## Warning: Coercing text to numeric in E1727 / R1727C5: '1'
## Warning: Coercing text to numeric in E1728 / R1728C5: '1'
## Warning: Coercing text to numeric in E1729 / R1729C5: '1'
## Warning: Coercing text to numeric in E1730 / R1730C5: '2'
## Warning: Coercing text to numeric in E1731 / R1731C5: '2'
## Warning: Coercing text to numeric in E1732 / R1732C5: '2'
## Warning: Coercing text to numeric in E1733 / R1733C5: '2'
## Warning: Coercing text to numeric in E1734 / R1734C5: '2'
## Warning: Coercing text to numeric in E1735 / R1735C5: '2'
## Warning: Coercing text to numeric in E1736 / R1736C5: '2'
## Warning: Coercing text to numeric in E1737 / R1737C5: '2'
## Warning: Coercing text to numeric in E1738 / R1738C5: '2'
## Warning: Coercing text to numeric in E1739 / R1739C5: '2'
## Warning: Coercing text to numeric in E1740 / R1740C5: '2'
## Warning: Coercing text to numeric in E1741 / R1741C5: '2'
## Warning: Coercing text to numeric in E1742 / R1742C5: '2'
## Warning: Coercing text to numeric in E1743 / R1743C5: '2'
## Warning: Coercing text to numeric in E1744 / R1744C5: '2'
## Warning: Coercing text to numeric in E1745 / R1745C5: '2'
## Warning: Coercing text to numeric in E1746 / R1746C5: '2'
## Warning: Coercing text to numeric in E1747 / R1747C5: '2'
## Warning: Coercing text to numeric in E1748 / R1748C5: '1'
## Warning: Coercing text to numeric in E1749 / R1749C5: '1'
## Warning: Coercing text to numeric in E1750 / R1750C5: '1'
## Warning: Coercing text to numeric in E1751 / R1751C5: '1'
## Warning: Coercing text to numeric in E1752 / R1752C5: '1'
## Warning: Coercing text to numeric in E1753 / R1753C5: '1'
## Warning: Coercing text to numeric in E1754 / R1754C5: '1'
## Warning: Coercing text to numeric in E1755 / R1755C5: '1'
## Warning: Coercing text to numeric in E1756 / R1756C5: '1'
## Warning: Coercing text to numeric in E1757 / R1757C5: '1'
## Warning: Coercing text to numeric in E1758 / R1758C5: '1'
## Warning: Coercing text to numeric in E1759 / R1759C5: '1'
## Warning: Coercing text to numeric in E1760 / R1760C5: '2'
## Warning: Coercing text to numeric in E1761 / R1761C5: '2'
## Warning: Coercing text to numeric in E1762 / R1762C5: '2'
## Warning: Coercing text to numeric in E1763 / R1763C5: '2'
## Warning: Coercing text to numeric in E1764 / R1764C5: '2'
## Warning: Coercing text to numeric in E1765 / R1765C5: '2'
## Warning: Coercing text to numeric in E1766 / R1766C5: '1'
## Warning: Coercing text to numeric in E1767 / R1767C5: '1'
## Warning: Coercing text to numeric in E1768 / R1768C5: '1'
## Warning: Coercing text to numeric in E1769 / R1769C5: '1'
## Warning: Coercing text to numeric in E1770 / R1770C5: '1'
## Warning: Coercing text to numeric in E1771 / R1771C5: '1'
## Warning: Coercing text to numeric in E1772 / R1772C5: '2'
## Warning: Coercing text to numeric in E1773 / R1773C5: '2'
## Warning: Coercing text to numeric in E1774 / R1774C5: '2'
## Warning: Coercing text to numeric in E1775 / R1775C5: '2'
## Warning: Coercing text to numeric in E1776 / R1776C5: '2'
## Warning: Coercing text to numeric in E1777 / R1777C5: '2'
## Warning: Coercing text to numeric in E1778 / R1778C5: '1'
## Warning: Coercing text to numeric in E1779 / R1779C5: '1'
## Warning: Coercing text to numeric in E1780 / R1780C5: '1'
## Warning: Coercing text to numeric in E1781 / R1781C5: '1'
## Warning: Coercing text to numeric in E1782 / R1782C5: '1'
## Warning: Coercing text to numeric in E1783 / R1783C5: '1'
## Warning: Coercing text to numeric in E1784 / R1784C5: '1'
## Warning: Coercing text to numeric in E1785 / R1785C5: '1'
## Warning: Coercing text to numeric in E1786 / R1786C5: '1'
## Warning: Coercing text to numeric in E1787 / R1787C5: '1'
## Warning: Coercing text to numeric in E1788 / R1788C5: '1'
## Warning: Coercing text to numeric in E1789 / R1789C5: '1'
## Warning: Coercing text to numeric in E1790 / R1790C5: '1'
## Warning: Coercing text to numeric in E1791 / R1791C5: '1'
## Warning: Coercing text to numeric in E1792 / R1792C5: '1'
## Warning: Coercing text to numeric in E1793 / R1793C5: '1'
## Warning: Coercing text to numeric in E1794 / R1794C5: '1'
## Warning: Coercing text to numeric in E1795 / R1795C5: '1'
## Warning: Coercing text to numeric in E1796 / R1796C5: '2'
## Warning: Coercing text to numeric in E1797 / R1797C5: '2'
## Warning: Coercing text to numeric in E1798 / R1798C5: '2'
## Warning: Coercing text to numeric in E1799 / R1799C5: '2'
## Warning: Coercing text to numeric in E1800 / R1800C5: '2'
## Warning: Coercing text to numeric in E1801 / R1801C5: '2'
## Warning: Coercing text to numeric in E1802 / R1802C5: '2'
## Warning: Coercing text to numeric in E1803 / R1803C5: '2'
## Warning: Coercing text to numeric in E1804 / R1804C5: '2'
## Warning: Coercing text to numeric in E1805 / R1805C5: '2'
## Warning: Coercing text to numeric in E1806 / R1806C5: '2'
## Warning: Coercing text to numeric in E1807 / R1807C5: '2'
## Warning: Coercing text to numeric in E1808 / R1808C5: '2'
## Warning: Coercing text to numeric in E1809 / R1809C5: '2'
## Warning: Coercing text to numeric in E1810 / R1810C5: '2'
## Warning: Coercing text to numeric in E1811 / R1811C5: '2'
## Warning: Coercing text to numeric in E1812 / R1812C5: '2'
## Warning: Coercing text to numeric in E1813 / R1813C5: '2'
## Warning: Coercing text to numeric in E1814 / R1814C5: '2'
## Warning: Coercing text to numeric in E1815 / R1815C5: '2'
## Warning: Coercing text to numeric in E1816 / R1816C5: '2'
## Warning: Coercing text to numeric in E1817 / R1817C5: '2'
## Warning: Coercing text to numeric in E1818 / R1818C5: '2'
## Warning: Coercing text to numeric in E1819 / R1819C5: '2'
## Warning: Coercing text to numeric in E1820 / R1820C5: '2'
## Warning: Coercing text to numeric in E1821 / R1821C5: '2'
## Warning: Coercing text to numeric in E1822 / R1822C5: '2'
## Warning: Coercing text to numeric in E1823 / R1823C5: '2'
## Warning: Coercing text to numeric in E1824 / R1824C5: '2'
## Warning: Coercing text to numeric in E1825 / R1825C5: '2'
## Warning: Coercing text to numeric in E1826 / R1826C5: '1'
## Warning: Coercing text to numeric in E1827 / R1827C5: '1'
## Warning: Coercing text to numeric in E1828 / R1828C5: '1'
## Warning: Coercing text to numeric in E1829 / R1829C5: '1'
## Warning: Coercing text to numeric in E1830 / R1830C5: '1'
## Warning: Coercing text to numeric in E1831 / R1831C5: '1'
## Warning: Coercing text to numeric in E1832 / R1832C5: '1'
## Warning: Coercing text to numeric in E1833 / R1833C5: '1'
## Warning: Coercing text to numeric in E1834 / R1834C5: '1'
## Warning: Coercing text to numeric in E1835 / R1835C5: '1'
## Warning: Coercing text to numeric in E1836 / R1836C5: '1'
## Warning: Coercing text to numeric in E1837 / R1837C5: '1'
## Warning: Coercing text to numeric in E1838 / R1838C5: '2'
## Warning: Coercing text to numeric in E1839 / R1839C5: '2'
## Warning: Coercing text to numeric in E1840 / R1840C5: '2'
## Warning: Coercing text to numeric in E1841 / R1841C5: '2'
## Warning: Coercing text to numeric in E1842 / R1842C5: '2'
## Warning: Coercing text to numeric in E1843 / R1843C5: '2'
## Warning: Coercing text to numeric in E1844 / R1844C5: '1'
## Warning: Coercing text to numeric in E1845 / R1845C5: '1'
## Warning: Coercing text to numeric in E1846 / R1846C5: '1'
## Warning: Coercing text to numeric in E1847 / R1847C5: '1'
## Warning: Coercing text to numeric in E1848 / R1848C5: '1'
## Warning: Coercing text to numeric in E1849 / R1849C5: '1'
## Warning: Coercing text to numeric in E1850 / R1850C5: '1'
## Warning: Coercing text to numeric in E1851 / R1851C5: '1'
## Warning: Coercing text to numeric in E1852 / R1852C5: '1'
## Warning: Coercing text to numeric in E1853 / R1853C5: '1'
## Warning: Coercing text to numeric in E1854 / R1854C5: '1'
## Warning: Coercing text to numeric in E1855 / R1855C5: '1'
## Warning: Coercing text to numeric in E1856 / R1856C5: '1'
## Warning: Coercing text to numeric in E1857 / R1857C5: '1'
## Warning: Coercing text to numeric in E1858 / R1858C5: '1'
## Warning: Coercing text to numeric in E1859 / R1859C5: '1'
## Warning: Coercing text to numeric in E1860 / R1860C5: '1'
## Warning: Coercing text to numeric in E1861 / R1861C5: '1'
## Warning: Coercing text to numeric in E1862 / R1862C5: '2'
## Warning: Coercing text to numeric in E1863 / R1863C5: '2'
## Warning: Coercing text to numeric in E1864 / R1864C5: '2'
## Warning: Coercing text to numeric in E1865 / R1865C5: '2'
## Warning: Coercing text to numeric in E1866 / R1866C5: '2'
## Warning: Coercing text to numeric in E1867 / R1867C5: '2'
## Warning: Coercing text to numeric in E1868 / R1868C5: '2'
## Warning: Coercing text to numeric in E1869 / R1869C5: '2'
## Warning: Coercing text to numeric in E1870 / R1870C5: '2'
## Warning: Coercing text to numeric in E1871 / R1871C5: '2'
## Warning: Coercing text to numeric in E1872 / R1872C5: '2'
## Warning: Coercing text to numeric in E1873 / R1873C5: '2'
## Warning: Coercing text to numeric in E1874 / R1874C5: '2'
## Warning: Coercing text to numeric in E1875 / R1875C5: '2'
## Warning: Coercing text to numeric in E1876 / R1876C5: '2'
## Warning: Coercing text to numeric in E1877 / R1877C5: '2'
## Warning: Coercing text to numeric in E1878 / R1878C5: '2'
## Warning: Coercing text to numeric in E1879 / R1879C5: '2'
## Warning: Coercing text to numeric in E1880 / R1880C5: '2'
## Warning: Coercing text to numeric in E1881 / R1881C5: '2'
## Warning: Coercing text to numeric in E1882 / R1882C5: '2'
## Warning: Coercing text to numeric in E1883 / R1883C5: '2'
## Warning: Coercing text to numeric in E1884 / R1884C5: '2'
## Warning: Coercing text to numeric in E1885 / R1885C5: '2'
## Warning: Coercing text to numeric in E1886 / R1886C5: '2'
## Warning: Coercing text to numeric in E1887 / R1887C5: '2'
## Warning: Coercing text to numeric in E1888 / R1888C5: '2'
## Warning: Coercing text to numeric in E1889 / R1889C5: '2'
## Warning: Coercing text to numeric in E1890 / R1890C5: '2'
## Warning: Coercing text to numeric in E1891 / R1891C5: '2'
## Warning: Coercing text to numeric in E1892 / R1892C5: '2'
## Warning: Coercing text to numeric in E1893 / R1893C5: '2'
## Warning: Coercing text to numeric in E1894 / R1894C5: '2'
## Warning: Coercing text to numeric in E1895 / R1895C5: '2'
## Warning: Coercing text to numeric in E1896 / R1896C5: '2'
## Warning: Coercing text to numeric in E1897 / R1897C5: '2'
## Warning: Coercing text to numeric in E1898 / R1898C5: '1'
## Warning: Coercing text to numeric in E1899 / R1899C5: '1'
## Warning: Coercing text to numeric in E1900 / R1900C5: '1'
## Warning: Coercing text to numeric in E1901 / R1901C5: '1'
## Warning: Coercing text to numeric in E1902 / R1902C5: '1'
## Warning: Coercing text to numeric in E1903 / R1903C5: '1'
## Warning: Coercing text to numeric in E1904 / R1904C5: '2'
## Warning: Coercing text to numeric in E1905 / R1905C5: '2'
## Warning: Coercing text to numeric in E1906 / R1906C5: '2'
## Warning: Coercing text to numeric in E1907 / R1907C5: '2'
## Warning: Coercing text to numeric in E1908 / R1908C5: '2'
## Warning: Coercing text to numeric in E1909 / R1909C5: '2'
## Warning: Coercing text to numeric in E1910 / R1910C5: '1'
## Warning: Coercing text to numeric in E1911 / R1911C5: '1'
## Warning: Coercing text to numeric in E1912 / R1912C5: '1'
## Warning: Coercing text to numeric in E1913 / R1913C5: '1'
## Warning: Coercing text to numeric in E1914 / R1914C5: '1'
## Warning: Coercing text to numeric in E1915 / R1915C5: '1'
## Warning: Coercing text to numeric in E1916 / R1916C5: '2'
## Warning: Coercing text to numeric in E1917 / R1917C5: '2'
## Warning: Coercing text to numeric in E1918 / R1918C5: '2'
## Warning: Coercing text to numeric in E1919 / R1919C5: '2'
## Warning: Coercing text to numeric in E1920 / R1920C5: '2'
## Warning: Coercing text to numeric in E1921 / R1921C5: '2'
## Warning: Coercing text to numeric in E1922 / R1922C5: '2'
## Warning: Coercing text to numeric in E1923 / R1923C5: '2'
## Warning: Coercing text to numeric in E1924 / R1924C5: '2'
## Warning: Coercing text to numeric in E1925 / R1925C5: '2'
## Warning: Coercing text to numeric in E1926 / R1926C5: '2'
## Warning: Coercing text to numeric in E1927 / R1927C5: '2'
## Warning: Coercing text to numeric in E1928 / R1928C5: '1'
## Warning: Coercing text to numeric in E1929 / R1929C5: '1'
## Warning: Coercing text to numeric in E1930 / R1930C5: '1'
## Warning: Coercing text to numeric in E1931 / R1931C5: '1'
## Warning: Coercing text to numeric in E1932 / R1932C5: '1'
## Warning: Coercing text to numeric in E1933 / R1933C5: '1'
## Warning: Coercing text to numeric in E1934 / R1934C5: '1'
## Warning: Coercing text to numeric in E1935 / R1935C5: '1'
## Warning: Coercing text to numeric in E1936 / R1936C5: '1'
## Warning: Coercing text to numeric in E1937 / R1937C5: '1'
## Warning: Coercing text to numeric in E1938 / R1938C5: '1'
## Warning: Coercing text to numeric in E1939 / R1939C5: '1'
## Warning: Coercing text to numeric in E1940 / R1940C5: '1'
## Warning: Coercing text to numeric in E1941 / R1941C5: '1'
## Warning: Coercing text to numeric in E1942 / R1942C5: '1'
## Warning: Coercing text to numeric in E1943 / R1943C5: '1'
## Warning: Coercing text to numeric in E1944 / R1944C5: '1'
## Warning: Coercing text to numeric in E1945 / R1945C5: '1'
## Warning: Coercing text to numeric in E1946 / R1946C5: '1'
## Warning: Coercing text to numeric in E1947 / R1947C5: '1'
## Warning: Coercing text to numeric in E1948 / R1948C5: '1'
## Warning: Coercing text to numeric in E1949 / R1949C5: '1'
## Warning: Coercing text to numeric in E1950 / R1950C5: '1'
## Warning: Coercing text to numeric in E1951 / R1951C5: '1'
## Warning: Coercing text to numeric in E1952 / R1952C5: '2'
## Warning: Coercing text to numeric in E1953 / R1953C5: '2'
## Warning: Coercing text to numeric in E1954 / R1954C5: '2'
## Warning: Coercing text to numeric in E1955 / R1955C5: '2'
## Warning: Coercing text to numeric in E1956 / R1956C5: '2'
## Warning: Coercing text to numeric in E1957 / R1957C5: '2'
## Warning: Coercing text to numeric in E1958 / R1958C5: '1'
## Warning: Coercing text to numeric in E1959 / R1959C5: '1'
## Warning: Coercing text to numeric in E1960 / R1960C5: '1'
## Warning: Coercing text to numeric in E1961 / R1961C5: '1'
## Warning: Coercing text to numeric in E1962 / R1962C5: '1'
## Warning: Coercing text to numeric in E1963 / R1963C5: '1'
## Warning: Coercing text to numeric in E1964 / R1964C5: '1'
## Warning: Coercing text to numeric in E1965 / R1965C5: '1'
## Warning: Coercing text to numeric in E1966 / R1966C5: '1'
## Warning: Coercing text to numeric in E1967 / R1967C5: '1'
## Warning: Coercing text to numeric in E1968 / R1968C5: '1'
## Warning: Coercing text to numeric in E1969 / R1969C5: '1'
## Warning: Coercing text to numeric in E1970 / R1970C5: '1'
## Warning: Coercing text to numeric in E1971 / R1971C5: '1'
## Warning: Coercing text to numeric in E1972 / R1972C5: '1'
## Warning: Coercing text to numeric in E1973 / R1973C5: '1'
## Warning: Coercing text to numeric in E1974 / R1974C5: '1'
## Warning: Coercing text to numeric in E1975 / R1975C5: '1'
## Warning: Coercing text to numeric in E1976 / R1976C5: '1'
## Warning: Coercing text to numeric in E1977 / R1977C5: '1'
## Warning: Coercing text to numeric in E1978 / R1978C5: '1'
## Warning: Coercing text to numeric in E1979 / R1979C5: '1'
## Warning: Coercing text to numeric in E1980 / R1980C5: '1'
## Warning: Coercing text to numeric in E1981 / R1981C5: '1'
## Warning: Coercing text to numeric in E1982 / R1982C5: '2'
## Warning: Coercing text to numeric in E1983 / R1983C5: '2'
## Warning: Coercing text to numeric in E1984 / R1984C5: '2'
## Warning: Coercing text to numeric in E1985 / R1985C5: '2'
## Warning: Coercing text to numeric in E1986 / R1986C5: '2'
## Warning: Coercing text to numeric in E1987 / R1987C5: '2'
## Warning: Coercing text to numeric in E1988 / R1988C5: '2'
## Warning: Coercing text to numeric in E1989 / R1989C5: '2'
## Warning: Coercing text to numeric in E1990 / R1990C5: '2'
## Warning: Coercing text to numeric in E1991 / R1991C5: '2'
## Warning: Coercing text to numeric in E1992 / R1992C5: '2'
## Warning: Coercing text to numeric in E1993 / R1993C5: '2'
## Warning: Coercing text to numeric in E1994 / R1994C5: '2'
## Warning: Coercing text to numeric in E1995 / R1995C5: '2'
## Warning: Coercing text to numeric in E1996 / R1996C5: '2'
## Warning: Coercing text to numeric in E1997 / R1997C5: '2'
## Warning: Coercing text to numeric in E1998 / R1998C5: '2'
## Warning: Coercing text to numeric in E1999 / R1999C5: '2'
## Warning: Coercing text to numeric in E2000 / R2000C5: '1'
## Warning: Coercing text to numeric in E2001 / R2001C5: '1'
## Warning: Coercing text to numeric in E2002 / R2002C5: '1'
## Warning: Coercing text to numeric in E2003 / R2003C5: '1'
## Warning: Coercing text to numeric in E2004 / R2004C5: '1'
## Warning: Coercing text to numeric in E2005 / R2005C5: '1'
## Warning: Coercing text to numeric in E2006 / R2006C5: '1'
## Warning: Coercing text to numeric in E2007 / R2007C5: '1'
## Warning: Coercing text to numeric in E2008 / R2008C5: '1'
## Warning: Coercing text to numeric in E2009 / R2009C5: '1'
## Warning: Coercing text to numeric in E2010 / R2010C5: '1'
## Warning: Coercing text to numeric in E2011 / R2011C5: '1'
## Warning: Coercing text to numeric in E2012 / R2012C5: '2'
## Warning: Coercing text to numeric in E2013 / R2013C5: '2'
## Warning: Coercing text to numeric in E2014 / R2014C5: '2'
## Warning: Coercing text to numeric in E2015 / R2015C5: '2'
## Warning: Coercing text to numeric in E2016 / R2016C5: '2'
## Warning: Coercing text to numeric in E2017 / R2017C5: '2'
## Warning: Coercing text to numeric in E2018 / R2018C5: '2'
## Warning: Coercing text to numeric in E2019 / R2019C5: '2'
## Warning: Coercing text to numeric in E2020 / R2020C5: '2'
## Warning: Coercing text to numeric in E2021 / R2021C5: '2'
## Warning: Coercing text to numeric in E2022 / R2022C5: '2'
## Warning: Coercing text to numeric in E2023 / R2023C5: '2'
## Warning: Coercing text to numeric in E2024 / R2024C5: '2'
## Warning: Coercing text to numeric in E2025 / R2025C5: '2'
## Warning: Coercing text to numeric in E2026 / R2026C5: '2'
## Warning: Coercing text to numeric in E2027 / R2027C5: '2'
## Warning: Coercing text to numeric in E2028 / R2028C5: '2'
## Warning: Coercing text to numeric in E2029 / R2029C5: '2'
## Warning: Coercing text to numeric in E2030 / R2030C5: '2'
## Warning: Coercing text to numeric in E2031 / R2031C5: '2'
## Warning: Coercing text to numeric in E2032 / R2032C5: '2'
## Warning: Coercing text to numeric in E2033 / R2033C5: '2'
## Warning: Coercing text to numeric in E2034 / R2034C5: '2'
## Warning: Coercing text to numeric in E2035 / R2035C5: '2'
## Warning: Coercing text to numeric in E2036 / R2036C5: '2'
## Warning: Coercing text to numeric in E2037 / R2037C5: '2'
## Warning: Coercing text to numeric in E2038 / R2038C5: '2'
## Warning: Coercing text to numeric in E2039 / R2039C5: '2'
## Warning: Coercing text to numeric in E2040 / R2040C5: '2'
## Warning: Coercing text to numeric in E2041 / R2041C5: '2'
## Warning: Coercing text to numeric in E2042 / R2042C5: '2'
## Warning: Coercing text to numeric in E2043 / R2043C5: '2'
## Warning: Coercing text to numeric in E2044 / R2044C5: '2'
## Warning: Coercing text to numeric in E2045 / R2045C5: '2'
## Warning: Coercing text to numeric in E2046 / R2046C5: '2'
## Warning: Coercing text to numeric in E2047 / R2047C5: '2'
## Warning: Coercing text to numeric in E2048 / R2048C5: '2'
## Warning: Coercing text to numeric in E2049 / R2049C5: '2'
## Warning: Coercing text to numeric in E2050 / R2050C5: '2'
## Warning: Coercing text to numeric in E2051 / R2051C5: '2'
## Warning: Coercing text to numeric in E2052 / R2052C5: '2'
## Warning: Coercing text to numeric in E2053 / R2053C5: '2'
## Warning: Coercing text to numeric in E2054 / R2054C5: '2'
## Warning: Coercing text to numeric in E2055 / R2055C5: '2'
## Warning: Coercing text to numeric in E2056 / R2056C5: '2'
## Warning: Coercing text to numeric in E2057 / R2057C5: '2'
## Warning: Coercing text to numeric in E2058 / R2058C5: '2'
## Warning: Coercing text to numeric in E2059 / R2059C5: '2'
## Warning: Coercing text to numeric in E2060 / R2060C5: '1'
## Warning: Coercing text to numeric in E2061 / R2061C5: '1'
## Warning: Coercing text to numeric in E2062 / R2062C5: '1'
## Warning: Coercing text to numeric in E2063 / R2063C5: '1'
## Warning: Coercing text to numeric in E2064 / R2064C5: '1'
## Warning: Coercing text to numeric in E2065 / R2065C5: '1'
## Warning: Coercing text to numeric in E2066 / R2066C5: '1'
## Warning: Coercing text to numeric in E2067 / R2067C5: '1'
## Warning: Coercing text to numeric in E2068 / R2068C5: '1'
## Warning: Coercing text to numeric in E2069 / R2069C5: '1'
## Warning: Coercing text to numeric in E2070 / R2070C5: '1'
## Warning: Coercing text to numeric in E2071 / R2071C5: '1'
## Warning: Coercing text to numeric in E2072 / R2072C5: '2'
## Warning: Coercing text to numeric in E2073 / R2073C5: '2'
## Warning: Coercing text to numeric in E2074 / R2074C5: '2'
## Warning: Coercing text to numeric in E2075 / R2075C5: '2'
## Warning: Coercing text to numeric in E2076 / R2076C5: '2'
## Warning: Coercing text to numeric in E2077 / R2077C5: '2'
## Warning: Coercing text to numeric in E2078 / R2078C5: '1'
## Warning: Coercing text to numeric in E2079 / R2079C5: '1'
## Warning: Coercing text to numeric in E2080 / R2080C5: '1'
## Warning: Coercing text to numeric in E2081 / R2081C5: '1'
## Warning: Coercing text to numeric in E2082 / R2082C5: '1'
## Warning: Coercing text to numeric in E2083 / R2083C5: '1'
## Warning: Coercing text to numeric in E2084 / R2084C5: '1'
## Warning: Coercing text to numeric in E2085 / R2085C5: '1'
## Warning: Coercing text to numeric in E2086 / R2086C5: '1'
## Warning: Coercing text to numeric in E2087 / R2087C5: '1'
## Warning: Coercing text to numeric in E2088 / R2088C5: '1'
## Warning: Coercing text to numeric in E2089 / R2089C5: '1'
## Warning: Coercing text to numeric in E2090 / R2090C5: '1'
## Warning: Coercing text to numeric in E2091 / R2091C5: '1'
## Warning: Coercing text to numeric in E2092 / R2092C5: '1'
## Warning: Coercing text to numeric in E2093 / R2093C5: '1'
## Warning: Coercing text to numeric in E2094 / R2094C5: '1'
## Warning: Coercing text to numeric in E2095 / R2095C5: '1'
## Warning: Coercing text to numeric in E2096 / R2096C5: '2'
## Warning: Coercing text to numeric in E2097 / R2097C5: '2'
## Warning: Coercing text to numeric in E2098 / R2098C5: '2'
## Warning: Coercing text to numeric in E2099 / R2099C5: '2'
## Warning: Coercing text to numeric in E2100 / R2100C5: '2'
## Warning: Coercing text to numeric in E2101 / R2101C5: '2'
## Warning: Coercing text to numeric in E2102 / R2102C5: '1'
## Warning: Coercing text to numeric in E2103 / R2103C5: '1'
## Warning: Coercing text to numeric in E2104 / R2104C5: '1'
## Warning: Coercing text to numeric in E2105 / R2105C5: '1'
## Warning: Coercing text to numeric in E2106 / R2106C5: '1'
## Warning: Coercing text to numeric in E2107 / R2107C5: '1'
## Warning: Coercing text to numeric in E2108 / R2108C5: '1'
## Warning: Coercing text to numeric in E2109 / R2109C5: '1'
## Warning: Coercing text to numeric in E2110 / R2110C5: '1'
## Warning: Coercing text to numeric in E2111 / R2111C5: '1'
## Warning: Coercing text to numeric in E2112 / R2112C5: '1'
## Warning: Coercing text to numeric in E2113 / R2113C5: '1'
## Warning: Coercing text to numeric in E2114 / R2114C5: '2'
## Warning: Coercing text to numeric in E2115 / R2115C5: '2'
## Warning: Coercing text to numeric in E2116 / R2116C5: '2'
## Warning: Coercing text to numeric in E2117 / R2117C5: '2'
## Warning: Coercing text to numeric in E2118 / R2118C5: '2'
## Warning: Coercing text to numeric in E2119 / R2119C5: '2'
## Warning: Coercing text to numeric in E2120 / R2120C5: '1'
## Warning: Coercing text to numeric in E2121 / R2121C5: '1'
## Warning: Coercing text to numeric in E2122 / R2122C5: '1'
## Warning: Coercing text to numeric in E2123 / R2123C5: '1'
## Warning: Coercing text to numeric in E2124 / R2124C5: '1'
## Warning: Coercing text to numeric in E2125 / R2125C5: '1'
## Warning: Coercing text to numeric in E2126 / R2126C5: '1'
## Warning: Coercing text to numeric in E2127 / R2127C5: '1'
## Warning: Coercing text to numeric in E2128 / R2128C5: '1'
## Warning: Coercing text to numeric in E2129 / R2129C5: '1'
## Warning: Coercing text to numeric in E2130 / R2130C5: '1'
## Warning: Coercing text to numeric in E2131 / R2131C5: '1'
## Warning: Coercing text to numeric in E2132 / R2132C5: '1'
## Warning: Coercing text to numeric in E2133 / R2133C5: '1'
## Warning: Coercing text to numeric in E2134 / R2134C5: '1'
## Warning: Coercing text to numeric in E2135 / R2135C5: '1'
## Warning: Coercing text to numeric in E2136 / R2136C5: '1'
## Warning: Coercing text to numeric in E2137 / R2137C5: '1'
## Warning: Coercing text to numeric in E2138 / R2138C5: '2'
## Warning: Coercing text to numeric in E2139 / R2139C5: '2'
## Warning: Coercing text to numeric in E2140 / R2140C5: '2'
## Warning: Coercing text to numeric in E2141 / R2141C5: '2'
## Warning: Coercing text to numeric in E2142 / R2142C5: '2'
## Warning: Coercing text to numeric in E2143 / R2143C5: '2'
## Warning: Coercing text to numeric in E2144 / R2144C5: '2'
## Warning: Coercing text to numeric in E2145 / R2145C5: '2'
## Warning: Coercing text to numeric in E2146 / R2146C5: '2'
## Warning: Coercing text to numeric in E2147 / R2147C5: '2'
## Warning: Coercing text to numeric in E2148 / R2148C5: '2'
## Warning: Coercing text to numeric in E2149 / R2149C5: '2'
## Warning: Coercing text to numeric in E2150 / R2150C5: '2'
## Warning: Coercing text to numeric in E2151 / R2151C5: '2'
## Warning: Coercing text to numeric in E2152 / R2152C5: '2'
## Warning: Coercing text to numeric in E2153 / R2153C5: '2'
## Warning: Coercing text to numeric in E2154 / R2154C5: '2'
## Warning: Coercing text to numeric in E2155 / R2155C5: '2'
## Warning: Coercing text to numeric in E2156 / R2156C5: '2'
## Warning: Coercing text to numeric in E2157 / R2157C5: '2'
## Warning: Coercing text to numeric in E2158 / R2158C5: '2'
## Warning: Coercing text to numeric in E2159 / R2159C5: '2'
## Warning: Coercing text to numeric in E2160 / R2160C5: '2'
## Warning: Coercing text to numeric in E2161 / R2161C5: '2'
## Warning: Coercing text to numeric in E2162 / R2162C5: '2'
## Warning: Coercing text to numeric in E2163 / R2163C5: '2'
## Warning: Coercing text to numeric in E2164 / R2164C5: '2'
## Warning: Coercing text to numeric in E2165 / R2165C5: '2'
## Warning: Coercing text to numeric in E2166 / R2166C5: '2'
## Warning: Coercing text to numeric in E2167 / R2167C5: '2'
## Warning: Coercing text to numeric in E2168 / R2168C5: '2'
## Warning: Coercing text to numeric in E2169 / R2169C5: '2'
## Warning: Coercing text to numeric in E2170 / R2170C5: '2'
## Warning: Coercing text to numeric in E2171 / R2171C5: '2'
## Warning: Coercing text to numeric in E2172 / R2172C5: '2'
## Warning: Coercing text to numeric in E2173 / R2173C5: '2'
## Warning: Coercing text to numeric in E2174 / R2174C5: '2'
## Warning: Coercing text to numeric in E2175 / R2175C5: '2'
## Warning: Coercing text to numeric in E2176 / R2176C5: '2'
## Warning: Coercing text to numeric in E2177 / R2177C5: '2'
## Warning: Coercing text to numeric in E2178 / R2178C5: '2'
## Warning: Coercing text to numeric in E2179 / R2179C5: '2'
## Warning: Coercing text to numeric in E2180 / R2180C5: '2'
## Warning: Coercing text to numeric in E2181 / R2181C5: '2'
## Warning: Coercing text to numeric in E2182 / R2182C5: '2'
## Warning: Coercing text to numeric in E2183 / R2183C5: '2'
## Warning: Coercing text to numeric in E2184 / R2184C5: '2'
## Warning: Coercing text to numeric in E2185 / R2185C5: '2'
## Warning: Coercing text to numeric in E2186 / R2186C5: '2'
## Warning: Coercing text to numeric in E2187 / R2187C5: '2'
## Warning: Coercing text to numeric in E2188 / R2188C5: '2'
## Warning: Coercing text to numeric in E2189 / R2189C5: '2'
## Warning: Coercing text to numeric in E2190 / R2190C5: '2'
## Warning: Coercing text to numeric in E2191 / R2191C5: '2'
## Warning: Coercing text to numeric in E2192 / R2192C5: '2'
## Warning: Coercing text to numeric in E2193 / R2193C5: '2'
## Warning: Coercing text to numeric in E2194 / R2194C5: '2'
## Warning: Coercing text to numeric in E2195 / R2195C5: '2'
## Warning: Coercing text to numeric in E2196 / R2196C5: '2'
## Warning: Coercing text to numeric in E2197 / R2197C5: '2'
## Warning: Coercing text to numeric in E2198 / R2198C5: '1'
## Warning: Coercing text to numeric in E2199 / R2199C5: '1'
## Warning: Coercing text to numeric in E2200 / R2200C5: '1'
## Warning: Coercing text to numeric in E2201 / R2201C5: '1'
## Warning: Coercing text to numeric in E2202 / R2202C5: '1'
## Warning: Coercing text to numeric in E2203 / R2203C5: '1'
## Warning: Coercing text to numeric in E2204 / R2204C5: '2'
## Warning: Coercing text to numeric in E2205 / R2205C5: '2'
## Warning: Coercing text to numeric in E2206 / R2206C5: '2'
## Warning: Coercing text to numeric in E2207 / R2207C5: '2'
## Warning: Coercing text to numeric in E2208 / R2208C5: '2'
## Warning: Coercing text to numeric in E2209 / R2209C5: '2'
## Warning: Coercing text to numeric in E2210 / R2210C5: '2'
## Warning: Coercing text to numeric in E2211 / R2211C5: '2'
## Warning: Coercing text to numeric in E2212 / R2212C5: '2'
## Warning: Coercing text to numeric in E2213 / R2213C5: '2'
## Warning: Coercing text to numeric in E2214 / R2214C5: '2'
## Warning: Coercing text to numeric in E2215 / R2215C5: '2'
## Warning: Coercing text to numeric in E2216 / R2216C5: '2'
## Warning: Coercing text to numeric in E2217 / R2217C5: '2'
## Warning: Coercing text to numeric in E2218 / R2218C5: '2'
## Warning: Coercing text to numeric in E2219 / R2219C5: '2'
## Warning: Coercing text to numeric in E2220 / R2220C5: '2'
## Warning: Coercing text to numeric in E2221 / R2221C5: '2'
## Warning: Coercing text to numeric in E2222 / R2222C5: '1'
## Warning: Coercing text to numeric in E2223 / R2223C5: '1'
## Warning: Coercing text to numeric in E2224 / R2224C5: '1'
## Warning: Coercing text to numeric in E2225 / R2225C5: '1'
## Warning: Coercing text to numeric in E2226 / R2226C5: '1'
## Warning: Coercing text to numeric in E2227 / R2227C5: '1'
## Warning: Coercing text to numeric in E2228 / R2228C5: '1'
## Warning: Coercing text to numeric in E2229 / R2229C5: '1'
## Warning: Coercing text to numeric in E2230 / R2230C5: '1'
## Warning: Coercing text to numeric in E2231 / R2231C5: '1'
## Warning: Coercing text to numeric in E2232 / R2232C5: '1'
## Warning: Coercing text to numeric in E2233 / R2233C5: '1'
## Warning: Coercing text to numeric in E2234 / R2234C5: '1'
## Warning: Coercing text to numeric in E2235 / R2235C5: '1'
## Warning: Coercing text to numeric in E2236 / R2236C5: '1'
## Warning: Coercing text to numeric in E2237 / R2237C5: '1'
## Warning: Coercing text to numeric in E2238 / R2238C5: '1'
## Warning: Coercing text to numeric in E2239 / R2239C5: '1'
## Warning: Coercing text to numeric in E2240 / R2240C5: '2'
## Warning: Coercing text to numeric in E2241 / R2241C5: '2'
## Warning: Coercing text to numeric in E2242 / R2242C5: '2'
## Warning: Coercing text to numeric in E2243 / R2243C5: '2'
## Warning: Coercing text to numeric in E2244 / R2244C5: '2'
## Warning: Coercing text to numeric in E2245 / R2245C5: '2'
## Warning: Coercing text to numeric in E2246 / R2246C5: '2'
## Warning: Coercing text to numeric in E2247 / R2247C5: '2'
## Warning: Coercing text to numeric in E2248 / R2248C5: '2'
## Warning: Coercing text to numeric in E2249 / R2249C5: '2'
## Warning: Coercing text to numeric in E2250 / R2250C5: '2'
## Warning: Coercing text to numeric in E2251 / R2251C5: '2'
## Warning: Coercing text to numeric in E2252 / R2252C5: '2'
## Warning: Coercing text to numeric in E2253 / R2253C5: '2'
## Warning: Coercing text to numeric in E2254 / R2254C5: '2'
## Warning: Coercing text to numeric in E2255 / R2255C5: '2'
## Warning: Coercing text to numeric in E2256 / R2256C5: '2'
## Warning: Coercing text to numeric in E2257 / R2257C5: '2'
## Warning: Coercing text to numeric in E2258 / R2258C5: '2'
## Warning: Coercing text to numeric in E2259 / R2259C5: '2'
## Warning: Coercing text to numeric in E2260 / R2260C5: '2'
## Warning: Coercing text to numeric in E2261 / R2261C5: '2'
## Warning: Coercing text to numeric in E2262 / R2262C5: '2'
## Warning: Coercing text to numeric in E2263 / R2263C5: '2'
## Warning: Coercing text to numeric in E2264 / R2264C5: '1'
## Warning: Coercing text to numeric in E2265 / R2265C5: '1'
## Warning: Coercing text to numeric in E2266 / R2266C5: '1'
## Warning: Coercing text to numeric in E2267 / R2267C5: '1'
## Warning: Coercing text to numeric in E2268 / R2268C5: '1'
## Warning: Coercing text to numeric in E2269 / R2269C5: '1'
## Warning: Coercing text to numeric in E2270 / R2270C5: '2'
## Warning: Coercing text to numeric in E2271 / R2271C5: '2'
## Warning: Coercing text to numeric in E2272 / R2272C5: '2'
## Warning: Coercing text to numeric in E2273 / R2273C5: '2'
## Warning: Coercing text to numeric in E2274 / R2274C5: '2'
## Warning: Coercing text to numeric in E2275 / R2275C5: '2'
## Warning: Coercing text to numeric in E2276 / R2276C5: '2'
## Warning: Coercing text to numeric in E2277 / R2277C5: '2'
## Warning: Coercing text to numeric in E2278 / R2278C5: '2'
## Warning: Coercing text to numeric in E2279 / R2279C5: '2'
## Warning: Coercing text to numeric in E2280 / R2280C5: '2'
## Warning: Coercing text to numeric in E2281 / R2281C5: '2'
## Warning: Coercing text to numeric in E2282 / R2282C5: '2'
## Warning: Coercing text to numeric in E2283 / R2283C5: '2'
## Warning: Coercing text to numeric in E2284 / R2284C5: '2'
## Warning: Coercing text to numeric in E2285 / R2285C5: '2'
## Warning: Coercing text to numeric in E2286 / R2286C5: '2'
## Warning: Coercing text to numeric in E2287 / R2287C5: '2'
## Warning: Coercing text to numeric in E2288 / R2288C5: '1'
## Warning: Coercing text to numeric in E2289 / R2289C5: '1'
## Warning: Coercing text to numeric in E2290 / R2290C5: '1'
## Warning: Coercing text to numeric in E2291 / R2291C5: '1'
## Warning: Coercing text to numeric in E2292 / R2292C5: '1'
## Warning: Coercing text to numeric in E2293 / R2293C5: '1'
## Warning: Coercing text to numeric in E2294 / R2294C5: '1'
## Warning: Coercing text to numeric in E2295 / R2295C5: '1'
## Warning: Coercing text to numeric in E2296 / R2296C5: '1'
## Warning: Coercing text to numeric in E2297 / R2297C5: '1'
## Warning: Coercing text to numeric in E2298 / R2298C5: '1'
## Warning: Coercing text to numeric in E2299 / R2299C5: '1'
## Warning: Coercing text to numeric in E2300 / R2300C5: '2'
## Warning: Coercing text to numeric in E2301 / R2301C5: '2'
## Warning: Coercing text to numeric in E2302 / R2302C5: '2'
## Warning: Coercing text to numeric in E2303 / R2303C5: '2'
## Warning: Coercing text to numeric in E2304 / R2304C5: '2'
## Warning: Coercing text to numeric in E2305 / R2305C5: '2'
## Warning: Coercing text to numeric in E2306 / R2306C5: '1'
## Warning: Coercing text to numeric in E2307 / R2307C5: '1'
## Warning: Coercing text to numeric in E2308 / R2308C5: '1'
## Warning: Coercing text to numeric in E2309 / R2309C5: '1'
## Warning: Coercing text to numeric in E2310 / R2310C5: '1'
## Warning: Coercing text to numeric in E2311 / R2311C5: '1'
## Warning: Coercing text to numeric in E2312 / R2312C5: '1'
## Warning: Coercing text to numeric in E2313 / R2313C5: '1'
## Warning: Coercing text to numeric in E2314 / R2314C5: '1'
## Warning: Coercing text to numeric in E2315 / R2315C5: '1'
## Warning: Coercing text to numeric in E2316 / R2316C5: '1'
## Warning: Coercing text to numeric in E2317 / R2317C5: '1'
## Warning: Coercing text to numeric in E2318 / R2318C5: '1'
## Warning: Coercing text to numeric in E2319 / R2319C5: '1'
## Warning: Coercing text to numeric in E2320 / R2320C5: '1'
## Warning: Coercing text to numeric in E2321 / R2321C5: '1'
## Warning: Coercing text to numeric in E2322 / R2322C5: '1'
## Warning: Coercing text to numeric in E2323 / R2323C5: '1'
## Warning: Coercing text to numeric in E2324 / R2324C5: '2'
## Warning: Coercing text to numeric in E2325 / R2325C5: '2'
## Warning: Coercing text to numeric in E2326 / R2326C5: '2'
## Warning: Coercing text to numeric in E2327 / R2327C5: '2'
## Warning: Coercing text to numeric in E2328 / R2328C5: '2'
## Warning: Coercing text to numeric in E2329 / R2329C5: '2'
## Warning: Coercing text to numeric in E2330 / R2330C5: '2'
## Warning: Coercing text to numeric in E2331 / R2331C5: '2'
## Warning: Coercing text to numeric in E2332 / R2332C5: '2'
## Warning: Coercing text to numeric in E2333 / R2333C5: '2'
## Warning: Coercing text to numeric in E2334 / R2334C5: '2'
## Warning: Coercing text to numeric in E2335 / R2335C5: '2'
## Warning: Coercing text to numeric in E2336 / R2336C5: '1'
## Warning: Coercing text to numeric in E2337 / R2337C5: '1'
## Warning: Coercing text to numeric in E2338 / R2338C5: '1'
## Warning: Coercing text to numeric in E2339 / R2339C5: '1'
## Warning: Coercing text to numeric in E2340 / R2340C5: '1'
## Warning: Coercing text to numeric in E2341 / R2341C5: '1'
## Warning: Coercing text to numeric in E2342 / R2342C5: '2'
## Warning: Coercing text to numeric in E2343 / R2343C5: '2'
## Warning: Coercing text to numeric in E2344 / R2344C5: '2'
## Warning: Coercing text to numeric in E2345 / R2345C5: '2'
## Warning: Coercing text to numeric in E2346 / R2346C5: '2'
## Warning: Coercing text to numeric in E2347 / R2347C5: '2'
## Warning: Coercing text to numeric in E2348 / R2348C5: '2'
## Warning: Coercing text to numeric in E2349 / R2349C5: '2'
## Warning: Coercing text to numeric in E2350 / R2350C5: '2'
## Warning: Coercing text to numeric in E2351 / R2351C5: '2'
## Warning: Coercing text to numeric in E2352 / R2352C5: '2'
## Warning: Coercing text to numeric in E2353 / R2353C5: '2'
## Warning: Coercing text to numeric in E2354 / R2354C5: '1'
## Warning: Coercing text to numeric in E2355 / R2355C5: '1'
## Warning: Coercing text to numeric in E2356 / R2356C5: '1'
## Warning: Coercing text to numeric in E2357 / R2357C5: '1'
## Warning: Coercing text to numeric in E2358 / R2358C5: '1'
## Warning: Coercing text to numeric in E2359 / R2359C5: '1'
## Warning: Coercing text to numeric in E2360 / R2360C5: '2'
## Warning: Coercing text to numeric in E2361 / R2361C5: '2'
## Warning: Coercing text to numeric in E2362 / R2362C5: '2'
## Warning: Coercing text to numeric in E2363 / R2363C5: '2'
## Warning: Coercing text to numeric in E2364 / R2364C5: '2'
## Warning: Coercing text to numeric in E2365 / R2365C5: '2'
## Warning: Coercing text to numeric in E2366 / R2366C5: '1'
## Warning: Coercing text to numeric in E2367 / R2367C5: '1'
## Warning: Coercing text to numeric in E2368 / R2368C5: '1'
## Warning: Coercing text to numeric in E2369 / R2369C5: '1'
## Warning: Coercing text to numeric in E2370 / R2370C5: '1'
## Warning: Coercing text to numeric in E2371 / R2371C5: '1'
## Warning: Coercing text to numeric in E2372 / R2372C5: '2'
## Warning: Coercing text to numeric in E2373 / R2373C5: '2'
## Warning: Coercing text to numeric in E2374 / R2374C5: '2'
## Warning: Coercing text to numeric in E2375 / R2375C5: '2'
## Warning: Coercing text to numeric in E2376 / R2376C5: '2'
## Warning: Coercing text to numeric in E2377 / R2377C5: '2'
## Warning: Coercing text to numeric in E2378 / R2378C5: '2'
## Warning: Coercing text to numeric in E2379 / R2379C5: '2'
## Warning: Coercing text to numeric in E2380 / R2380C5: '2'
## Warning: Coercing text to numeric in E2381 / R2381C5: '2'
## Warning: Coercing text to numeric in E2382 / R2382C5: '2'
## Warning: Coercing text to numeric in E2383 / R2383C5: '2'
## Warning: Coercing text to numeric in E2384 / R2384C5: '2'
## Warning: Coercing text to numeric in E2385 / R2385C5: '2'
## Warning: Coercing text to numeric in E2386 / R2386C5: '2'
## Warning: Coercing text to numeric in E2387 / R2387C5: '2'
## Warning: Coercing text to numeric in E2388 / R2388C5: '2'
## Warning: Coercing text to numeric in E2389 / R2389C5: '2'
## Warning: Coercing text to numeric in E2390 / R2390C5: '2'
## Warning: Coercing text to numeric in E2391 / R2391C5: '2'
## Warning: Coercing text to numeric in E2392 / R2392C5: '2'
## Warning: Coercing text to numeric in E2393 / R2393C5: '2'
## Warning: Coercing text to numeric in E2394 / R2394C5: '2'
## Warning: Coercing text to numeric in E2395 / R2395C5: '2'
## Warning: Coercing text to numeric in E2396 / R2396C5: '1'
## Warning: Coercing text to numeric in E2397 / R2397C5: '1'
## Warning: Coercing text to numeric in E2398 / R2398C5: '1'
## Warning: Coercing text to numeric in E2399 / R2399C5: '1'
## Warning: Coercing text to numeric in E2400 / R2400C5: '1'
## Warning: Coercing text to numeric in E2401 / R2401C5: '1'
## Warning: Coercing text to numeric in E2402 / R2402C5: '2'
## Warning: Coercing text to numeric in E2403 / R2403C5: '2'
## Warning: Coercing text to numeric in E2404 / R2404C5: '2'
## Warning: Coercing text to numeric in E2405 / R2405C5: '2'
## Warning: Coercing text to numeric in E2406 / R2406C5: '2'
## Warning: Coercing text to numeric in E2407 / R2407C5: '2'
## Warning: Coercing text to numeric in E2408 / R2408C5: '1'
## Warning: Coercing text to numeric in E2409 / R2409C5: '1'
## Warning: Coercing text to numeric in E2410 / R2410C5: '1'
## Warning: Coercing text to numeric in E2411 / R2411C5: '1'
## Warning: Coercing text to numeric in E2412 / R2412C5: '1'
## Warning: Coercing text to numeric in E2413 / R2413C5: '1'
## Warning: Coercing text to numeric in E2414 / R2414C5: '2'
## Warning: Coercing text to numeric in E2415 / R2415C5: '2'
## Warning: Coercing text to numeric in E2416 / R2416C5: '2'
## Warning: Coercing text to numeric in E2417 / R2417C5: '2'
## Warning: Coercing text to numeric in E2418 / R2418C5: '2'
## Warning: Coercing text to numeric in E2419 / R2419C5: '2'
## Warning: Coercing text to numeric in E2420 / R2420C5: '1'
## Warning: Coercing text to numeric in E2421 / R2421C5: '1'
## Warning: Coercing text to numeric in E2422 / R2422C5: '1'
## Warning: Coercing text to numeric in E2423 / R2423C5: '1'
## Warning: Coercing text to numeric in E2424 / R2424C5: '1'
## Warning: Coercing text to numeric in E2425 / R2425C5: '1'
## Warning: Coercing text to numeric in E2426 / R2426C5: '1'
## Warning: Coercing text to numeric in E2427 / R2427C5: '1'
## Warning: Coercing text to numeric in E2428 / R2428C5: '1'
## Warning: Coercing text to numeric in E2429 / R2429C5: '1'
## Warning: Coercing text to numeric in E2430 / R2430C5: '1'
## Warning: Coercing text to numeric in E2431 / R2431C5: '1'
## Warning: Coercing text to numeric in E2432 / R2432C5: '1'
## Warning: Coercing text to numeric in E2433 / R2433C5: '1'
## Warning: Coercing text to numeric in E2434 / R2434C5: '1'
## Warning: Coercing text to numeric in E2435 / R2435C5: '1'
## Warning: Coercing text to numeric in E2436 / R2436C5: '1'
## Warning: Coercing text to numeric in E2437 / R2437C5: '1'
## Warning: Coercing text to numeric in E2438 / R2438C5: '1'
## Warning: Coercing text to numeric in E2439 / R2439C5: '1'
## Warning: Coercing text to numeric in E2440 / R2440C5: '1'
## Warning: Coercing text to numeric in E2441 / R2441C5: '1'
## Warning: Coercing text to numeric in E2442 / R2442C5: '1'
## Warning: Coercing text to numeric in E2443 / R2443C5: '1'
## Warning: Coercing text to numeric in E2444 / R2444C5: '1'
## Warning: Coercing text to numeric in E2445 / R2445C5: '1'
## Warning: Coercing text to numeric in E2446 / R2446C5: '1'
## Warning: Coercing text to numeric in E2447 / R2447C5: '1'
## Warning: Coercing text to numeric in E2448 / R2448C5: '1'
## Warning: Coercing text to numeric in E2449 / R2449C5: '1'
## Warning: Coercing text to numeric in E2450 / R2450C5: '1'
## Warning: Coercing text to numeric in E2451 / R2451C5: '1'
## Warning: Coercing text to numeric in E2452 / R2452C5: '1'
## Warning: Coercing text to numeric in E2453 / R2453C5: '1'
## Warning: Coercing text to numeric in E2454 / R2454C5: '1'
## Warning: Coercing text to numeric in E2455 / R2455C5: '1'
## Warning: Coercing text to numeric in E2456 / R2456C5: '2'
## Warning: Coercing text to numeric in E2457 / R2457C5: '2'
## Warning: Coercing text to numeric in E2458 / R2458C5: '2'
## Warning: Coercing text to numeric in E2459 / R2459C5: '2'
## Warning: Coercing text to numeric in E2460 / R2460C5: '2'
## Warning: Coercing text to numeric in E2461 / R2461C5: '2'
## Warning: Coercing text to numeric in E2462 / R2462C5: '1'
## Warning: Coercing text to numeric in E2463 / R2463C5: '1'
## Warning: Coercing text to numeric in E2464 / R2464C5: '1'
## Warning: Coercing text to numeric in E2465 / R2465C5: '1'
## Warning: Coercing text to numeric in E2466 / R2466C5: '1'
## Warning: Coercing text to numeric in E2467 / R2467C5: '1'
## Warning: Coercing text to numeric in E2468 / R2468C5: '2'
## Warning: Coercing text to numeric in E2469 / R2469C5: '2'
## Warning: Coercing text to numeric in E2470 / R2470C5: '2'
## Warning: Coercing text to numeric in E2471 / R2471C5: '2'
## Warning: Coercing text to numeric in E2472 / R2472C5: '2'
## Warning: Coercing text to numeric in E2473 / R2473C5: '2'
## Warning: Coercing text to numeric in E2474 / R2474C5: '2'
## Warning: Coercing text to numeric in E2475 / R2475C5: '2'
## Warning: Coercing text to numeric in E2476 / R2476C5: '2'
## Warning: Coercing text to numeric in E2477 / R2477C5: '2'
## Warning: Coercing text to numeric in E2478 / R2478C5: '2'
## Warning: Coercing text to numeric in E2479 / R2479C5: '2'
## Warning: Coercing text to numeric in E2480 / R2480C5: '2'
## Warning: Coercing text to numeric in E2481 / R2481C5: '2'
## Warning: Coercing text to numeric in E2482 / R2482C5: '2'
## Warning: Coercing text to numeric in E2483 / R2483C5: '2'
## Warning: Coercing text to numeric in E2484 / R2484C5: '2'
## Warning: Coercing text to numeric in E2485 / R2485C5: '2'
## Warning: Coercing text to numeric in E2486 / R2486C5: '2'
## Warning: Coercing text to numeric in E2487 / R2487C5: '2'
## Warning: Coercing text to numeric in E2488 / R2488C5: '2'
## Warning: Coercing text to numeric in E2489 / R2489C5: '2'
## Warning: Coercing text to numeric in E2490 / R2490C5: '2'
## Warning: Coercing text to numeric in E2491 / R2491C5: '2'
## Warning: Coercing text to numeric in E2492 / R2492C5: '1'
## Warning: Coercing text to numeric in E2493 / R2493C5: '1'
## Warning: Coercing text to numeric in E2494 / R2494C5: '1'
## Warning: Coercing text to numeric in E2495 / R2495C5: '1'
## Warning: Coercing text to numeric in E2496 / R2496C5: '1'
## Warning: Coercing text to numeric in E2497 / R2497C5: '1'
## Warning: Coercing text to numeric in E2498 / R2498C5: '2'
## Warning: Coercing text to numeric in E2499 / R2499C5: '2'
## Warning: Coercing text to numeric in E2500 / R2500C5: '2'
## Warning: Coercing text to numeric in E2501 / R2501C5: '2'
## Warning: Coercing text to numeric in E2502 / R2502C5: '2'
## Warning: Coercing text to numeric in E2503 / R2503C5: '2'
## Warning: Coercing text to numeric in E2504 / R2504C5: '1'
## Warning: Coercing text to numeric in E2505 / R2505C5: '1'
## Warning: Coercing text to numeric in E2506 / R2506C5: '1'
## Warning: Coercing text to numeric in E2507 / R2507C5: '1'
## Warning: Coercing text to numeric in E2508 / R2508C5: '1'
## Warning: Coercing text to numeric in E2509 / R2509C5: '1'
## Warning: Coercing text to numeric in E2510 / R2510C5: '1'
## Warning: Coercing text to numeric in E2511 / R2511C5: '1'
## Warning: Coercing text to numeric in E2512 / R2512C5: '1'
## Warning: Coercing text to numeric in E2513 / R2513C5: '1'
## Warning: Coercing text to numeric in E2514 / R2514C5: '1'
## Warning: Coercing text to numeric in E2515 / R2515C5: '1'
## Warning: Coercing text to numeric in E2516 / R2516C5: '1'
## Warning: Coercing text to numeric in E2517 / R2517C5: '1'
## Warning: Coercing text to numeric in E2518 / R2518C5: '1'
## Warning: Coercing text to numeric in E2519 / R2519C5: '1'
## Warning: Coercing text to numeric in E2520 / R2520C5: '1'
## Warning: Coercing text to numeric in E2521 / R2521C5: '1'
## Warning: Coercing text to numeric in E2522 / R2522C5: '1'
## Warning: Coercing text to numeric in E2523 / R2523C5: '1'
## Warning: Coercing text to numeric in E2524 / R2524C5: '1'
## Warning: Coercing text to numeric in E2525 / R2525C5: '1'
## Warning: Coercing text to numeric in E2526 / R2526C5: '1'
## Warning: Coercing text to numeric in E2527 / R2527C5: '1'
## Warning: Coercing text to numeric in E2528 / R2528C5: '2'
## Warning: Coercing text to numeric in E2529 / R2529C5: '2'
## Warning: Coercing text to numeric in E2530 / R2530C5: '2'
## Warning: Coercing text to numeric in E2531 / R2531C5: '2'
## Warning: Coercing text to numeric in E2532 / R2532C5: '2'
## Warning: Coercing text to numeric in E2533 / R2533C5: '2'
## Warning: Coercing text to numeric in E2534 / R2534C5: '2'
## Warning: Coercing text to numeric in E2535 / R2535C5: '2'
## Warning: Coercing text to numeric in E2536 / R2536C5: '2'
## Warning: Coercing text to numeric in E2537 / R2537C5: '2'
## Warning: Coercing text to numeric in E2538 / R2538C5: '2'
## Warning: Coercing text to numeric in E2539 / R2539C5: '2'
## Warning: Coercing text to numeric in E2540 / R2540C5: '1'
## Warning: Coercing text to numeric in E2541 / R2541C5: '1'
## Warning: Coercing text to numeric in E2542 / R2542C5: '1'
## Warning: Coercing text to numeric in E2543 / R2543C5: '1'
## Warning: Coercing text to numeric in E2544 / R2544C5: '1'
## Warning: Coercing text to numeric in E2545 / R2545C5: '1'
## Warning: Coercing text to numeric in E2546 / R2546C5: '2'
## Warning: Coercing text to numeric in E2547 / R2547C5: '2'
## Warning: Coercing text to numeric in E2548 / R2548C5: '2'
## Warning: Coercing text to numeric in E2549 / R2549C5: '2'
## Warning: Coercing text to numeric in E2550 / R2550C5: '2'
## Warning: Coercing text to numeric in E2551 / R2551C5: '2'
## Warning: Coercing text to numeric in E2552 / R2552C5: '2'
## Warning: Coercing text to numeric in E2553 / R2553C5: '2'
## Warning: Coercing text to numeric in E2554 / R2554C5: '2'
## Warning: Coercing text to numeric in E2555 / R2555C5: '2'
## Warning: Coercing text to numeric in E2556 / R2556C5: '2'
## Warning: Coercing text to numeric in E2557 / R2557C5: '2'
## Warning: Coercing text to numeric in E2558 / R2558C5: '2'
## Warning: Coercing text to numeric in E2559 / R2559C5: '2'
## Warning: Coercing text to numeric in E2560 / R2560C5: '2'
## Warning: Coercing text to numeric in E2561 / R2561C5: '2'
## Warning: Coercing text to numeric in E2562 / R2562C5: '2'
## Warning: Coercing text to numeric in E2563 / R2563C5: '2'
## Warning: Coercing text to numeric in E2564 / R2564C5: '2'
## Warning: Coercing text to numeric in E2565 / R2565C5: '2'
## Warning: Coercing text to numeric in E2566 / R2566C5: '2'
## Warning: Coercing text to numeric in E2567 / R2567C5: '2'
## Warning: Coercing text to numeric in E2568 / R2568C5: '2'
## Warning: Coercing text to numeric in E2569 / R2569C5: '2'
## Warning: Coercing text to numeric in E2570 / R2570C5: '1'
## Warning: Coercing text to numeric in E2571 / R2571C5: '1'
## Warning: Coercing text to numeric in E2572 / R2572C5: '1'
## Warning: Coercing text to numeric in E2573 / R2573C5: '1'
## Warning: Coercing text to numeric in E2574 / R2574C5: '1'
## Warning: Coercing text to numeric in E2575 / R2575C5: '1'
## Warning: Coercing text to numeric in E2576 / R2576C5: '1'
## Warning: Coercing text to numeric in E2577 / R2577C5: '1'
## Warning: Coercing text to numeric in E2578 / R2578C5: '1'
## Warning: Coercing text to numeric in E2579 / R2579C5: '1'
## Warning: Coercing text to numeric in E2580 / R2580C5: '1'
## Warning: Coercing text to numeric in E2581 / R2581C5: '1'
## Warning: Coercing text to numeric in E2582 / R2582C5: '1'
## Warning: Coercing text to numeric in E2583 / R2583C5: '1'
## Warning: Coercing text to numeric in E2584 / R2584C5: '1'
## Warning: Coercing text to numeric in E2585 / R2585C5: '1'
## Warning: Coercing text to numeric in E2586 / R2586C5: '1'
## Warning: Coercing text to numeric in E2587 / R2587C5: '1'
## Warning: Coercing text to numeric in E2588 / R2588C5: '1'
## Warning: Coercing text to numeric in E2589 / R2589C5: '1'
## Warning: Coercing text to numeric in E2590 / R2590C5: '1'
## Warning: Coercing text to numeric in E2591 / R2591C5: '1'
## Warning: Coercing text to numeric in E2592 / R2592C5: '1'
## Warning: Coercing text to numeric in E2593 / R2593C5: '1'
## Warning: Coercing text to numeric in E2594 / R2594C5: '1'
## Warning: Coercing text to numeric in E2595 / R2595C5: '1'
## Warning: Coercing text to numeric in E2596 / R2596C5: '1'
## Warning: Coercing text to numeric in E2597 / R2597C5: '1'
## Warning: Coercing text to numeric in E2598 / R2598C5: '1'
## Warning: Coercing text to numeric in E2599 / R2599C5: '1'
## Warning: Coercing text to numeric in E2600 / R2600C5: '2'
## Warning: Coercing text to numeric in E2601 / R2601C5: '2'
## Warning: Coercing text to numeric in E2602 / R2602C5: '2'
## Warning: Coercing text to numeric in E2603 / R2603C5: '2'
## Warning: Coercing text to numeric in E2604 / R2604C5: '2'
## Warning: Coercing text to numeric in E2605 / R2605C5: '2'
## Warning: Coercing text to numeric in E2606 / R2606C5: '1'
## Warning: Coercing text to numeric in E2607 / R2607C5: '1'
## Warning: Coercing text to numeric in E2608 / R2608C5: '1'
## Warning: Coercing text to numeric in E2609 / R2609C5: '1'
## Warning: Coercing text to numeric in E2610 / R2610C5: '1'
## Warning: Coercing text to numeric in E2611 / R2611C5: '1'
## Warning: Coercing text to numeric in E2612 / R2612C5: '1'
## Warning: Coercing text to numeric in E2613 / R2613C5: '1'
## Warning: Coercing text to numeric in E2614 / R2614C5: '1'
## Warning: Coercing text to numeric in E2615 / R2615C5: '1'
## Warning: Coercing text to numeric in E2616 / R2616C5: '1'
## Warning: Coercing text to numeric in E2617 / R2617C5: '1'
## Warning: Coercing text to numeric in E2618 / R2618C5: '2'
## Warning: Coercing text to numeric in E2619 / R2619C5: '2'
## Warning: Coercing text to numeric in E2620 / R2620C5: '2'
## Warning: Coercing text to numeric in E2621 / R2621C5: '2'
## Warning: Coercing text to numeric in E2622 / R2622C5: '2'
## Warning: Coercing text to numeric in E2623 / R2623C5: '2'
## Warning: Coercing text to numeric in E2624 / R2624C5: '2'
## Warning: Coercing text to numeric in E2625 / R2625C5: '2'
## Warning: Coercing text to numeric in E2626 / R2626C5: '2'
## Warning: Coercing text to numeric in E2627 / R2627C5: '2'
## Warning: Coercing text to numeric in E2628 / R2628C5: '2'
## Warning: Coercing text to numeric in E2629 / R2629C5: '2'
## Warning: Coercing text to numeric in E2630 / R2630C5: '2'
## Warning: Coercing text to numeric in E2631 / R2631C5: '2'
## Warning: Coercing text to numeric in E2632 / R2632C5: '2'
## Warning: Coercing text to numeric in E2633 / R2633C5: '2'
## Warning: Coercing text to numeric in E2634 / R2634C5: '2'
## Warning: Coercing text to numeric in E2635 / R2635C5: '2'
## Warning: Coercing text to numeric in E2636 / R2636C5: '1'
## Warning: Coercing text to numeric in E2637 / R2637C5: '1'
## Warning: Coercing text to numeric in E2638 / R2638C5: '1'
## Warning: Coercing text to numeric in E2639 / R2639C5: '1'
## Warning: Coercing text to numeric in E2640 / R2640C5: '1'
## Warning: Coercing text to numeric in E2641 / R2641C5: '1'
## Warning: Coercing text to numeric in E2642 / R2642C5: '2'
## Warning: Coercing text to numeric in E2643 / R2643C5: '2'
## Warning: Coercing text to numeric in E2644 / R2644C5: '2'
## Warning: Coercing text to numeric in E2645 / R2645C5: '2'
## Warning: Coercing text to numeric in E2646 / R2646C5: '2'
## Warning: Coercing text to numeric in E2647 / R2647C5: '2'
## Warning: Coercing text to numeric in E2648 / R2648C5: '1'
## Warning: Coercing text to numeric in E2649 / R2649C5: '1'
## Warning: Coercing text to numeric in E2650 / R2650C5: '1'
## Warning: Coercing text to numeric in E2651 / R2651C5: '1'
## Warning: Coercing text to numeric in E2652 / R2652C5: '1'
## Warning: Coercing text to numeric in E2653 / R2653C5: '1'
## Warning: Coercing text to numeric in E2654 / R2654C5: '2'
## Warning: Coercing text to numeric in E2655 / R2655C5: '2'
## Warning: Coercing text to numeric in E2656 / R2656C5: '2'
## Warning: Coercing text to numeric in E2657 / R2657C5: '2'
## Warning: Coercing text to numeric in E2658 / R2658C5: '2'
## Warning: Coercing text to numeric in E2659 / R2659C5: '2'
## Warning: Coercing text to numeric in E2660 / R2660C5: '1'
## Warning: Coercing text to numeric in E2661 / R2661C5: '1'
## Warning: Coercing text to numeric in E2662 / R2662C5: '1'
## Warning: Coercing text to numeric in E2663 / R2663C5: '1'
## Warning: Coercing text to numeric in E2664 / R2664C5: '1'
## Warning: Coercing text to numeric in E2665 / R2665C5: '1'
## Warning: Coercing text to numeric in E2666 / R2666C5: '1'
## Warning: Coercing text to numeric in E2667 / R2667C5: '1'
## Warning: Coercing text to numeric in E2668 / R2668C5: '1'
## Warning: Coercing text to numeric in E2669 / R2669C5: '1'
## Warning: Coercing text to numeric in E2670 / R2670C5: '1'
## Warning: Coercing text to numeric in E2671 / R2671C5: '1'
## Warning: Coercing text to numeric in E2672 / R2672C5: '2'
## Warning: Coercing text to numeric in E2673 / R2673C5: '2'
## Warning: Coercing text to numeric in E2674 / R2674C5: '2'
## Warning: Coercing text to numeric in E2675 / R2675C5: '2'
## Warning: Coercing text to numeric in E2676 / R2676C5: '2'
## Warning: Coercing text to numeric in E2677 / R2677C5: '2'
## Warning: Coercing text to numeric in E2678 / R2678C5: '2'
## Warning: Coercing text to numeric in E2679 / R2679C5: '2'
## Warning: Coercing text to numeric in E2680 / R2680C5: '2'
## Warning: Coercing text to numeric in E2681 / R2681C5: '2'
## Warning: Coercing text to numeric in E2682 / R2682C5: '2'
## Warning: Coercing text to numeric in E2683 / R2683C5: '2'
## Warning: Coercing text to numeric in E2684 / R2684C5: '1'
## Warning: Coercing text to numeric in E2685 / R2685C5: '1'
## Warning: Coercing text to numeric in E2686 / R2686C5: '1'
## Warning: Coercing text to numeric in E2687 / R2687C5: '1'
## Warning: Coercing text to numeric in E2688 / R2688C5: '1'
## Warning: Coercing text to numeric in E2689 / R2689C5: '1'
## Warning: Coercing text to numeric in E2690 / R2690C5: '2'
## Warning: Coercing text to numeric in E2691 / R2691C5: '2'
## Warning: Coercing text to numeric in E2692 / R2692C5: '2'
## Warning: Coercing text to numeric in E2693 / R2693C5: '2'
## Warning: Coercing text to numeric in E2694 / R2694C5: '2'
## Warning: Coercing text to numeric in E2695 / R2695C5: '2'
## Warning: Coercing text to numeric in E2696 / R2696C5: '1'
## Warning: Coercing text to numeric in E2697 / R2697C5: '1'
## Warning: Coercing text to numeric in E2698 / R2698C5: '1'
## Warning: Coercing text to numeric in E2699 / R2699C5: '1'
## Warning: Coercing text to numeric in E2700 / R2700C5: '1'
## Warning: Coercing text to numeric in E2701 / R2701C5: '1'
## Warning: Coercing text to numeric in E2702 / R2702C5: '2'
## Warning: Coercing text to numeric in E2703 / R2703C5: '2'
## Warning: Coercing text to numeric in E2704 / R2704C5: '2'
## Warning: Coercing text to numeric in E2705 / R2705C5: '2'
## Warning: Coercing text to numeric in E2706 / R2706C5: '2'
## Warning: Coercing text to numeric in E2707 / R2707C5: '2'
## Warning: Coercing text to numeric in E2708 / R2708C5: '2'
## Warning: Coercing text to numeric in E2709 / R2709C5: '2'
## Warning: Coercing text to numeric in E2710 / R2710C5: '2'
## Warning: Coercing text to numeric in E2711 / R2711C5: '2'
## Warning: Coercing text to numeric in E2712 / R2712C5: '2'
## Warning: Coercing text to numeric in E2713 / R2713C5: '2'
## Warning: Coercing text to numeric in E2714 / R2714C5: '1'
## Warning: Coercing text to numeric in E2715 / R2715C5: '1'
## Warning: Coercing text to numeric in E2716 / R2716C5: '1'
## Warning: Coercing text to numeric in E2717 / R2717C5: '1'
## Warning: Coercing text to numeric in E2718 / R2718C5: '1'
## Warning: Coercing text to numeric in E2719 / R2719C5: '1'
## Warning: Coercing text to numeric in E2720 / R2720C5: '1'
## Warning: Coercing text to numeric in E2721 / R2721C5: '1'
## Warning: Coercing text to numeric in E2722 / R2722C5: '1'
## Warning: Coercing text to numeric in E2723 / R2723C5: '1'
## Warning: Coercing text to numeric in E2724 / R2724C5: '1'
## Warning: Coercing text to numeric in E2725 / R2725C5: '1'
## Warning: Coercing text to numeric in E2726 / R2726C5: '1'
## Warning: Coercing text to numeric in E2727 / R2727C5: '1'
## Warning: Coercing text to numeric in E2728 / R2728C5: '1'
## Warning: Coercing text to numeric in E2729 / R2729C5: '1'
## Warning: Coercing text to numeric in E2730 / R2730C5: '1'
## Warning: Coercing text to numeric in E2731 / R2731C5: '1'
## Warning: Coercing text to numeric in E2732 / R2732C5: '2'
## Warning: Coercing text to numeric in E2733 / R2733C5: '2'
## Warning: Coercing text to numeric in E2734 / R2734C5: '2'
## Warning: Coercing text to numeric in E2735 / R2735C5: '2'
## Warning: Coercing text to numeric in E2736 / R2736C5: '2'
## Warning: Coercing text to numeric in E2737 / R2737C5: '2'
## Warning: Coercing text to numeric in E2738 / R2738C5: '1'
## Warning: Coercing text to numeric in E2739 / R2739C5: '1'
## Warning: Coercing text to numeric in E2740 / R2740C5: '1'
## Warning: Coercing text to numeric in E2741 / R2741C5: '1'
## Warning: Coercing text to numeric in E2742 / R2742C5: '1'
## Warning: Coercing text to numeric in E2743 / R2743C5: '1'
## Warning: Coercing text to numeric in E2744 / R2744C5: '1'
## Warning: Coercing text to numeric in E2745 / R2745C5: '1'
## Warning: Coercing text to numeric in E2746 / R2746C5: '1'
## Warning: Coercing text to numeric in E2747 / R2747C5: '1'
## Warning: Coercing text to numeric in E2748 / R2748C5: '1'
## Warning: Coercing text to numeric in E2749 / R2749C5: '1'
## Warning: Coercing text to numeric in E2750 / R2750C5: '1'
## Warning: Coercing text to numeric in E2751 / R2751C5: '1'
## Warning: Coercing text to numeric in E2752 / R2752C5: '1'
## Warning: Coercing text to numeric in E2753 / R2753C5: '1'
## Warning: Coercing text to numeric in E2754 / R2754C5: '1'
## Warning: Coercing text to numeric in E2755 / R2755C5: '1'
## Warning: Coercing text to numeric in E2756 / R2756C5: '1'
## Warning: Coercing text to numeric in E2757 / R2757C5: '1'
## Warning: Coercing text to numeric in E2758 / R2758C5: '1'
## Warning: Coercing text to numeric in E2759 / R2759C5: '1'
## Warning: Coercing text to numeric in E2760 / R2760C5: '1'
## Warning: Coercing text to numeric in E2761 / R2761C5: '1'
## Warning: Coercing text to numeric in E2762 / R2762C5: '1'
## Warning: Coercing text to numeric in E2763 / R2763C5: '1'
## Warning: Coercing text to numeric in E2764 / R2764C5: '1'
## Warning: Coercing text to numeric in E2765 / R2765C5: '1'
## Warning: Coercing text to numeric in E2766 / R2766C5: '1'
## Warning: Coercing text to numeric in E2767 / R2767C5: '1'
## Warning: Coercing text to numeric in E2768 / R2768C5: '1'
## Warning: Coercing text to numeric in E2769 / R2769C5: '1'
## Warning: Coercing text to numeric in E2770 / R2770C5: '1'
## Warning: Coercing text to numeric in E2771 / R2771C5: '1'
## Warning: Coercing text to numeric in E2772 / R2772C5: '1'
## Warning: Coercing text to numeric in E2773 / R2773C5: '1'
## Warning: Coercing text to numeric in E2774 / R2774C5: '1'
## Warning: Coercing text to numeric in E2775 / R2775C5: '1'
## Warning: Coercing text to numeric in E2776 / R2776C5: '1'
## Warning: Coercing text to numeric in E2777 / R2777C5: '1'
## Warning: Coercing text to numeric in E2778 / R2778C5: '1'
## Warning: Coercing text to numeric in E2779 / R2779C5: '1'
## Warning: Coercing text to numeric in E2780 / R2780C5: '1'
## Warning: Coercing text to numeric in E2781 / R2781C5: '1'
## Warning: Coercing text to numeric in E2782 / R2782C5: '1'
## Warning: Coercing text to numeric in E2783 / R2783C5: '1'
## Warning: Coercing text to numeric in E2784 / R2784C5: '1'
## Warning: Coercing text to numeric in E2785 / R2785C5: '1'
## Warning: Coercing text to numeric in E2786 / R2786C5: '1'
## Warning: Coercing text to numeric in E2787 / R2787C5: '1'
## Warning: Coercing text to numeric in E2788 / R2788C5: '1'
## Warning: Coercing text to numeric in E2789 / R2789C5: '1'
## Warning: Coercing text to numeric in E2790 / R2790C5: '1'
## Warning: Coercing text to numeric in E2791 / R2791C5: '1'
## Warning: Coercing text to numeric in E2792 / R2792C5: '2'
## Warning: Coercing text to numeric in E2793 / R2793C5: '2'
## Warning: Coercing text to numeric in E2794 / R2794C5: '2'
## Warning: Coercing text to numeric in E2795 / R2795C5: '2'
## Warning: Coercing text to numeric in E2796 / R2796C5: '2'
## Warning: Coercing text to numeric in E2797 / R2797C5: '2'
## Warning: Coercing text to numeric in E2798 / R2798C5: '2'
## Warning: Coercing text to numeric in E2799 / R2799C5: '2'
## Warning: Coercing text to numeric in E2800 / R2800C5: '2'
## Warning: Coercing text to numeric in E2801 / R2801C5: '2'
## Warning: Coercing text to numeric in E2802 / R2802C5: '2'
## Warning: Coercing text to numeric in E2803 / R2803C5: '2'
## Warning: Coercing text to numeric in E2804 / R2804C5: '2'
## Warning: Coercing text to numeric in E2805 / R2805C5: '2'
## Warning: Coercing text to numeric in E2806 / R2806C5: '2'
## Warning: Coercing text to numeric in E2807 / R2807C5: '2'
## Warning: Coercing text to numeric in E2808 / R2808C5: '2'
## Warning: Coercing text to numeric in E2809 / R2809C5: '2'
## Warning: Coercing text to numeric in E2810 / R2810C5: '2'
## Warning: Coercing text to numeric in E2811 / R2811C5: '2'
## Warning: Coercing text to numeric in E2812 / R2812C5: '2'
## Warning: Coercing text to numeric in E2813 / R2813C5: '2'
## Warning: Coercing text to numeric in E2814 / R2814C5: '2'
## Warning: Coercing text to numeric in E2815 / R2815C5: '2'
## Warning: Coercing text to numeric in E2816 / R2816C5: '2'
## Warning: Coercing text to numeric in E2817 / R2817C5: '2'
## Warning: Coercing text to numeric in E2818 / R2818C5: '2'
## Warning: Coercing text to numeric in E2819 / R2819C5: '2'
## Warning: Coercing text to numeric in E2820 / R2820C5: '2'
## Warning: Coercing text to numeric in E2821 / R2821C5: '2'
## Warning: Coercing text to numeric in E2822 / R2822C5: '2'
## Warning: Coercing text to numeric in E2823 / R2823C5: '2'
## Warning: Coercing text to numeric in E2824 / R2824C5: '2'
## Warning: Coercing text to numeric in E2825 / R2825C5: '2'
## Warning: Coercing text to numeric in E2826 / R2826C5: '2'
## Warning: Coercing text to numeric in E2827 / R2827C5: '2'
## Warning: Coercing text to numeric in E2828 / R2828C5: '1'
## Warning: Coercing text to numeric in E2829 / R2829C5: '1'
## Warning: Coercing text to numeric in E2830 / R2830C5: '1'
## Warning: Coercing text to numeric in E2831 / R2831C5: '1'
## Warning: Coercing text to numeric in E2832 / R2832C5: '1'
## Warning: Coercing text to numeric in E2833 / R2833C5: '1'
## Warning: Coercing text to numeric in E2834 / R2834C5: '1'
## Warning: Coercing text to numeric in E2835 / R2835C5: '1'
## Warning: Coercing text to numeric in E2836 / R2836C5: '1'
## Warning: Coercing text to numeric in E2837 / R2837C5: '1'
## Warning: Coercing text to numeric in E2838 / R2838C5: '1'
## Warning: Coercing text to numeric in E2839 / R2839C5: '1'
## Warning: Coercing text to numeric in E2840 / R2840C5: '2'
## Warning: Coercing text to numeric in E2841 / R2841C5: '2'
## Warning: Coercing text to numeric in E2842 / R2842C5: '2'
## Warning: Coercing text to numeric in E2843 / R2843C5: '2'
## Warning: Coercing text to numeric in E2844 / R2844C5: '2'
## Warning: Coercing text to numeric in E2845 / R2845C5: '2'
## Warning: Coercing text to numeric in E2846 / R2846C5: '2'
## Warning: Coercing text to numeric in E2847 / R2847C5: '2'
## Warning: Coercing text to numeric in E2848 / R2848C5: '2'
## Warning: Coercing text to numeric in E2849 / R2849C5: '2'
## Warning: Coercing text to numeric in E2850 / R2850C5: '2'
## Warning: Coercing text to numeric in E2851 / R2851C5: '2'
## Warning: Coercing text to numeric in E2852 / R2852C5: '2'
## Warning: Coercing text to numeric in E2853 / R2853C5: '2'
## Warning: Coercing text to numeric in E2854 / R2854C5: '2'
## Warning: Coercing text to numeric in E2855 / R2855C5: '2'
## Warning: Coercing text to numeric in E2856 / R2856C5: '2'
## Warning: Coercing text to numeric in E2857 / R2857C5: '2'
## Warning: Coercing text to numeric in E2858 / R2858C5: '1'
## Warning: Coercing text to numeric in E2859 / R2859C5: '1'
## Warning: Coercing text to numeric in E2860 / R2860C5: '1'
## Warning: Coercing text to numeric in E2861 / R2861C5: '1'
## Warning: Coercing text to numeric in E2862 / R2862C5: '1'
## Warning: Coercing text to numeric in E2863 / R2863C5: '1'
## Warning: Coercing text to numeric in E2864 / R2864C5: '2'
## Warning: Coercing text to numeric in E2865 / R2865C5: '2'
## Warning: Coercing text to numeric in E2866 / R2866C5: '2'
## Warning: Coercing text to numeric in E2867 / R2867C5: '2'
## Warning: Coercing text to numeric in E2868 / R2868C5: '2'
## Warning: Coercing text to numeric in E2869 / R2869C5: '2'
## Warning: Coercing text to numeric in E2870 / R2870C5: '1'
## Warning: Coercing text to numeric in E2871 / R2871C5: '1'
## Warning: Coercing text to numeric in E2872 / R2872C5: '1'
## Warning: Coercing text to numeric in E2873 / R2873C5: '1'
## Warning: Coercing text to numeric in E2874 / R2874C5: '1'
## Warning: Coercing text to numeric in E2875 / R2875C5: '1'
## Warning: Coercing text to numeric in E2876 / R2876C5: '1'
## Warning: Coercing text to numeric in E2877 / R2877C5: '1'
## Warning: Coercing text to numeric in E2878 / R2878C5: '1'
## Warning: Coercing text to numeric in E2879 / R2879C5: '1'
## Warning: Coercing text to numeric in E2880 / R2880C5: '1'
## Warning: Coercing text to numeric in E2881 / R2881C5: '1'
## Warning: Coercing text to numeric in E2882 / R2882C5: '2'
## Warning: Coercing text to numeric in E2883 / R2883C5: '2'
## Warning: Coercing text to numeric in E2884 / R2884C5: '2'
## Warning: Coercing text to numeric in E2885 / R2885C5: '2'
## Warning: Coercing text to numeric in E2886 / R2886C5: '2'
## Warning: Coercing text to numeric in E2887 / R2887C5: '2'
## Warning: Coercing text to numeric in E2888 / R2888C5: '1'
## Warning: Coercing text to numeric in E2889 / R2889C5: '1'
## Warning: Coercing text to numeric in E2890 / R2890C5: '1'
## Warning: Coercing text to numeric in E2891 / R2891C5: '1'
## Warning: Coercing text to numeric in E2892 / R2892C5: '1'
## Warning: Coercing text to numeric in E2893 / R2893C5: '1'
## Warning: Coercing text to numeric in E2894 / R2894C5: '1'
## Warning: Coercing text to numeric in E2895 / R2895C5: '1'
## Warning: Coercing text to numeric in E2896 / R2896C5: '1'
## Warning: Coercing text to numeric in E2897 / R2897C5: '1'
## Warning: Coercing text to numeric in E2898 / R2898C5: '1'
## Warning: Coercing text to numeric in E2899 / R2899C5: '1'
## Warning: Coercing text to numeric in E2900 / R2900C5: '1'
## Warning: Coercing text to numeric in E2901 / R2901C5: '1'
## Warning: Coercing text to numeric in E2902 / R2902C5: '1'
## Warning: Coercing text to numeric in E2903 / R2903C5: '1'
## Warning: Coercing text to numeric in E2904 / R2904C5: '1'
## Warning: Coercing text to numeric in E2905 / R2905C5: '1'
## Warning: Coercing text to numeric in E2906 / R2906C5: '2'
## Warning: Coercing text to numeric in E2907 / R2907C5: '2'
## Warning: Coercing text to numeric in E2908 / R2908C5: '2'
## Warning: Coercing text to numeric in E2909 / R2909C5: '2'
## Warning: Coercing text to numeric in E2910 / R2910C5: '2'
## Warning: Coercing text to numeric in E2911 / R2911C5: '2'
## Warning: Coercing text to numeric in E2912 / R2912C5: '1'
## Warning: Coercing text to numeric in E2913 / R2913C5: '1'
## Warning: Coercing text to numeric in E2914 / R2914C5: '1'
## Warning: Coercing text to numeric in E2915 / R2915C5: '1'
## Warning: Coercing text to numeric in E2916 / R2916C5: '1'
## Warning: Coercing text to numeric in E2917 / R2917C5: '1'
## Warning: Coercing text to numeric in E2918 / R2918C5: '1'
## Warning: Coercing text to numeric in E2919 / R2919C5: '1'
## Warning: Coercing text to numeric in E2920 / R2920C5: '1'
## Warning: Coercing text to numeric in E2921 / R2921C5: '1'
## Warning: Coercing text to numeric in E2922 / R2922C5: '1'
## Warning: Coercing text to numeric in E2923 / R2923C5: '1'
## Warning: Coercing text to numeric in E2924 / R2924C5: '2'
## Warning: Coercing text to numeric in E2925 / R2925C5: '2'
## Warning: Coercing text to numeric in E2926 / R2926C5: '2'
## Warning: Coercing text to numeric in E2927 / R2927C5: '2'
## Warning: Coercing text to numeric in E2928 / R2928C5: '2'
## Warning: Coercing text to numeric in E2929 / R2929C5: '2'
## Warning: Coercing text to numeric in E2930 / R2930C5: '2'
## Warning: Coercing text to numeric in E2931 / R2931C5: '2'
## Warning: Coercing text to numeric in E2932 / R2932C5: '2'
## Warning: Coercing text to numeric in E2933 / R2933C5: '2'
## Warning: Coercing text to numeric in E2934 / R2934C5: '2'
## Warning: Coercing text to numeric in E2935 / R2935C5: '2'
## Warning: Coercing text to numeric in E2936 / R2936C5: '2'
## Warning: Coercing text to numeric in E2937 / R2937C5: '2'
## Warning: Coercing text to numeric in E2938 / R2938C5: '2'
## Warning: Coercing text to numeric in E2939 / R2939C5: '2'
## Warning: Coercing text to numeric in E2940 / R2940C5: '2'
## Warning: Coercing text to numeric in E2941 / R2941C5: '2'
## Warning: Coercing text to numeric in E2942 / R2942C5: '2'
## Warning: Coercing text to numeric in E2943 / R2943C5: '2'
## Warning: Coercing text to numeric in E2944 / R2944C5: '2'
## Warning: Coercing text to numeric in E2945 / R2945C5: '2'
## Warning: Coercing text to numeric in E2946 / R2946C5: '2'
## Warning: Coercing text to numeric in E2947 / R2947C5: '2'
## Warning: Coercing text to numeric in E2948 / R2948C5: '2'
## Warning: Coercing text to numeric in E2949 / R2949C5: '2'
## Warning: Coercing text to numeric in E2950 / R2950C5: '2'
## Warning: Coercing text to numeric in E2951 / R2951C5: '2'
## Warning: Coercing text to numeric in E2952 / R2952C5: '2'
## Warning: Coercing text to numeric in E2953 / R2953C5: '2'
## Warning: Coercing text to numeric in E2954 / R2954C5: '2'
## Warning: Coercing text to numeric in E2955 / R2955C5: '2'
## Warning: Coercing text to numeric in E2956 / R2956C5: '2'
## Warning: Coercing text to numeric in E2957 / R2957C5: '2'
## Warning: Coercing text to numeric in E2958 / R2958C5: '2'
## Warning: Coercing text to numeric in E2959 / R2959C5: '2'
## Warning: Coercing text to numeric in E2960 / R2960C5: '2'
## Warning: Coercing text to numeric in E2961 / R2961C5: '2'
## Warning: Coercing text to numeric in E2962 / R2962C5: '2'
## Warning: Coercing text to numeric in E2963 / R2963C5: '2'
## Warning: Coercing text to numeric in E2964 / R2964C5: '2'
## Warning: Coercing text to numeric in E2965 / R2965C5: '2'
## Warning: Coercing text to numeric in E2966 / R2966C5: '1'
## Warning: Coercing text to numeric in E2967 / R2967C5: '1'
## Warning: Coercing text to numeric in E2968 / R2968C5: '1'
## Warning: Coercing text to numeric in E2969 / R2969C5: '1'
## Warning: Coercing text to numeric in E2970 / R2970C5: '1'
## Warning: Coercing text to numeric in E2971 / R2971C5: '1'
## Warning: Coercing text to numeric in E2972 / R2972C5: '2'
## Warning: Coercing text to numeric in E2973 / R2973C5: '2'
## Warning: Coercing text to numeric in E2974 / R2974C5: '2'
## Warning: Coercing text to numeric in E2975 / R2975C5: '2'
## Warning: Coercing text to numeric in E2976 / R2976C5: '2'
## Warning: Coercing text to numeric in E2977 / R2977C5: '2'
## Warning: Coercing text to numeric in E2978 / R2978C5: '2'
## Warning: Coercing text to numeric in E2979 / R2979C5: '2'
## Warning: Coercing text to numeric in E2980 / R2980C5: '2'
## Warning: Coercing text to numeric in E2981 / R2981C5: '2'
## Warning: Coercing text to numeric in E2982 / R2982C5: '2'
## Warning: Coercing text to numeric in E2983 / R2983C5: '2'
## Warning: Coercing text to numeric in E2984 / R2984C5: '1'
## Warning: Coercing text to numeric in E2985 / R2985C5: '1'
## Warning: Coercing text to numeric in E2986 / R2986C5: '1'
## Warning: Coercing text to numeric in E2987 / R2987C5: '1'
## Warning: Coercing text to numeric in E2988 / R2988C5: '1'
## Warning: Coercing text to numeric in E2989 / R2989C5: '1'
## Warning: Coercing text to numeric in E2990 / R2990C5: '1'
## Warning: Coercing text to numeric in E2991 / R2991C5: '1'
## Warning: Coercing text to numeric in E2992 / R2992C5: '1'
## Warning: Coercing text to numeric in E2993 / R2993C5: '1'
## Warning: Coercing text to numeric in E2994 / R2994C5: '1'
## Warning: Coercing text to numeric in E2995 / R2995C5: '1'
## Warning: Coercing text to numeric in E2996 / R2996C5: '1'
## Warning: Coercing text to numeric in E2997 / R2997C5: '1'
## Warning: Coercing text to numeric in E2998 / R2998C5: '1'
## Warning: Coercing text to numeric in E2999 / R2999C5: '1'
## Warning: Coercing text to numeric in E3000 / R3000C5: '1'
## Warning: Coercing text to numeric in E3001 / R3001C5: '1'
## Warning: Coercing text to numeric in E3002 / R3002C5: '2'
## Warning: Coercing text to numeric in E3003 / R3003C5: '2'
## Warning: Coercing text to numeric in E3004 / R3004C5: '2'
## Warning: Coercing text to numeric in E3005 / R3005C5: '2'
## Warning: Coercing text to numeric in E3006 / R3006C5: '2'
## Warning: Coercing text to numeric in E3007 / R3007C5: '2'
## Warning: Coercing text to numeric in E3008 / R3008C5: '2'
## Warning: Coercing text to numeric in E3009 / R3009C5: '2'
## Warning: Coercing text to numeric in E3010 / R3010C5: '2'
## Warning: Coercing text to numeric in E3011 / R3011C5: '2'
## Warning: Coercing text to numeric in E3012 / R3012C5: '2'
## Warning: Coercing text to numeric in E3013 / R3013C5: '2'
## Warning: Coercing text to numeric in E3014 / R3014C5: '1'
## Warning: Coercing text to numeric in E3015 / R3015C5: '1'
## Warning: Coercing text to numeric in E3016 / R3016C5: '1'
## Warning: Coercing text to numeric in E3017 / R3017C5: '1'
## Warning: Coercing text to numeric in E3018 / R3018C5: '1'
## Warning: Coercing text to numeric in E3019 / R3019C5: '1'
## Warning: Coercing text to numeric in E3020 / R3020C5: '1'
## Warning: Coercing text to numeric in E3021 / R3021C5: '1'
## Warning: Coercing text to numeric in E3022 / R3022C5: '1'
## Warning: Coercing text to numeric in E3023 / R3023C5: '1'
## Warning: Coercing text to numeric in E3024 / R3024C5: '1'
## Warning: Coercing text to numeric in E3025 / R3025C5: '1'
## Warning: Coercing text to numeric in E3026 / R3026C5: '2'
## Warning: Coercing text to numeric in E3027 / R3027C5: '2'
## Warning: Coercing text to numeric in E3028 / R3028C5: '2'
## Warning: Coercing text to numeric in E3029 / R3029C5: '2'
## Warning: Coercing text to numeric in E3030 / R3030C5: '2'
## Warning: Coercing text to numeric in E3031 / R3031C5: '2'
## Warning: Coercing text to numeric in E3032 / R3032C5: '1'
## Warning: Coercing text to numeric in E3033 / R3033C5: '1'
## Warning: Coercing text to numeric in E3034 / R3034C5: '1'
## Warning: Coercing text to numeric in E3035 / R3035C5: '1'
## Warning: Coercing text to numeric in E3036 / R3036C5: '1'
## Warning: Coercing text to numeric in E3037 / R3037C5: '1'
## Warning: Coercing text to numeric in E3038 / R3038C5: '2'
## Warning: Coercing text to numeric in E3039 / R3039C5: '2'
## Warning: Coercing text to numeric in E3040 / R3040C5: '2'
## Warning: Coercing text to numeric in E3041 / R3041C5: '2'
## Warning: Coercing text to numeric in E3042 / R3042C5: '2'
## Warning: Coercing text to numeric in E3043 / R3043C5: '2'
## Warning: Coercing text to numeric in E3044 / R3044C5: '1'
## Warning: Coercing text to numeric in E3045 / R3045C5: '1'
## Warning: Coercing text to numeric in E3046 / R3046C5: '1'
## Warning: Coercing text to numeric in E3047 / R3047C5: '1'
## Warning: Coercing text to numeric in E3048 / R3048C5: '1'
## Warning: Coercing text to numeric in E3049 / R3049C5: '1'
## Warning: Coercing text to numeric in E3050 / R3050C5: '2'
## Warning: Coercing text to numeric in E3051 / R3051C5: '2'
## Warning: Coercing text to numeric in E3052 / R3052C5: '2'
## Warning: Coercing text to numeric in E3053 / R3053C5: '2'
## Warning: Coercing text to numeric in E3054 / R3054C5: '2'
## Warning: Coercing text to numeric in E3055 / R3055C5: '2'
## Warning: Coercing text to numeric in E3056 / R3056C5: '2'
## Warning: Coercing text to numeric in E3057 / R3057C5: '2'
## Warning: Coercing text to numeric in E3058 / R3058C5: '2'
## Warning: Coercing text to numeric in E3059 / R3059C5: '2'
## Warning: Coercing text to numeric in E3060 / R3060C5: '2'
## Warning: Coercing text to numeric in E3061 / R3061C5: '2'
## Warning: Coercing text to numeric in E3062 / R3062C5: '2'
## Warning: Coercing text to numeric in E3063 / R3063C5: '2'
## Warning: Coercing text to numeric in E3064 / R3064C5: '2'
## Warning: Coercing text to numeric in E3065 / R3065C5: '2'
## Warning: Coercing text to numeric in E3066 / R3066C5: '2'
## Warning: Coercing text to numeric in E3067 / R3067C5: '2'
## Warning: Coercing text to numeric in E3068 / R3068C5: '2'
## Warning: Coercing text to numeric in E3069 / R3069C5: '2'
## Warning: Coercing text to numeric in E3070 / R3070C5: '2'
## Warning: Coercing text to numeric in E3071 / R3071C5: '2'
## Warning: Coercing text to numeric in E3072 / R3072C5: '2'
## Warning: Coercing text to numeric in E3073 / R3073C5: '2'
## Warning: Coercing text to numeric in E3074 / R3074C5: '1'
## Warning: Coercing text to numeric in E3075 / R3075C5: '1'
## Warning: Coercing text to numeric in E3076 / R3076C5: '1'
## Warning: Coercing text to numeric in E3077 / R3077C5: '1'
## Warning: Coercing text to numeric in E3078 / R3078C5: '1'
## Warning: Coercing text to numeric in E3079 / R3079C5: '1'
## Warning: Coercing text to numeric in E3080 / R3080C5: '1'
## Warning: Coercing text to numeric in E3081 / R3081C5: '1'
## Warning: Coercing text to numeric in E3082 / R3082C5: '1'
## Warning: Coercing text to numeric in E3083 / R3083C5: '1'
## Warning: Coercing text to numeric in E3084 / R3084C5: '1'
## Warning: Coercing text to numeric in E3085 / R3085C5: '1'
## Warning: Coercing text to numeric in E3086 / R3086C5: '2'
## Warning: Coercing text to numeric in E3087 / R3087C5: '2'
## Warning: Coercing text to numeric in E3088 / R3088C5: '2'
## Warning: Coercing text to numeric in E3089 / R3089C5: '2'
## Warning: Coercing text to numeric in E3090 / R3090C5: '2'
## Warning: Coercing text to numeric in E3091 / R3091C5: '2'
## Warning: Coercing text to numeric in E3092 / R3092C5: '2'
## Warning: Coercing text to numeric in E3093 / R3093C5: '2'
## Warning: Coercing text to numeric in E3094 / R3094C5: '2'
## Warning: Coercing text to numeric in E3095 / R3095C5: '2'
## Warning: Coercing text to numeric in E3096 / R3096C5: '2'
## Warning: Coercing text to numeric in E3097 / R3097C5: '2'
## Warning: Coercing text to numeric in E3098 / R3098C5: '1'
## Warning: Coercing text to numeric in E3099 / R3099C5: '1'
## Warning: Coercing text to numeric in E3100 / R3100C5: '1'
## Warning: Coercing text to numeric in E3101 / R3101C5: '1'
## Warning: Coercing text to numeric in E3102 / R3102C5: '1'
## Warning: Coercing text to numeric in E3103 / R3103C5: '1'
## Warning: Coercing text to numeric in E3104 / R3104C5: '2'
## Warning: Coercing text to numeric in E3105 / R3105C5: '2'
## Warning: Coercing text to numeric in E3106 / R3106C5: '2'
## Warning: Coercing text to numeric in E3107 / R3107C5: '2'
## Warning: Coercing text to numeric in E3108 / R3108C5: '2'
## Warning: Coercing text to numeric in E3109 / R3109C5: '2'
## Warning: Coercing text to numeric in E3110 / R3110C5: '2'
## Warning: Coercing text to numeric in E3111 / R3111C5: '2'
## Warning: Coercing text to numeric in E3112 / R3112C5: '2'
## Warning: Coercing text to numeric in E3113 / R3113C5: '2'
## Warning: Coercing text to numeric in E3114 / R3114C5: '2'
## Warning: Coercing text to numeric in E3115 / R3115C5: '2'
## Warning: Coercing text to numeric in E3116 / R3116C5: '1'
## Warning: Coercing text to numeric in E3117 / R3117C5: '1'
## Warning: Coercing text to numeric in E3118 / R3118C5: '1'
## Warning: Coercing text to numeric in E3119 / R3119C5: '1'
## Warning: Coercing text to numeric in E3120 / R3120C5: '1'
## Warning: Coercing text to numeric in E3121 / R3121C5: '1'
## Warning: Coercing text to numeric in E3122 / R3122C5: '2'
## Warning: Coercing text to numeric in E3123 / R3123C5: '2'
## Warning: Coercing text to numeric in E3124 / R3124C5: '2'
## Warning: Coercing text to numeric in E3125 / R3125C5: '2'
## Warning: Coercing text to numeric in E3126 / R3126C5: '2'
## Warning: Coercing text to numeric in E3127 / R3127C5: '2'
## Warning: Coercing text to numeric in E3128 / R3128C5: '1'
## Warning: Coercing text to numeric in E3129 / R3129C5: '1'
## Warning: Coercing text to numeric in E3130 / R3130C5: '1'
## Warning: Coercing text to numeric in E3131 / R3131C5: '1'
## Warning: Coercing text to numeric in E3132 / R3132C5: '1'
## Warning: Coercing text to numeric in E3133 / R3133C5: '1'
## Warning: Coercing text to numeric in E3134 / R3134C5: '2'
## Warning: Coercing text to numeric in E3135 / R3135C5: '2'
## Warning: Coercing text to numeric in E3136 / R3136C5: '2'
## Warning: Coercing text to numeric in E3137 / R3137C5: '2'
## Warning: Coercing text to numeric in E3138 / R3138C5: '2'
## Warning: Coercing text to numeric in E3139 / R3139C5: '2'
## Warning: Coercing text to numeric in E3140 / R3140C5: '2'
## Warning: Coercing text to numeric in E3141 / R3141C5: '2'
## Warning: Coercing text to numeric in E3142 / R3142C5: '2'
## Warning: Coercing text to numeric in E3143 / R3143C5: '2'
## Warning: Coercing text to numeric in E3144 / R3144C5: '2'
## Warning: Coercing text to numeric in E3145 / R3145C5: '2'
## Warning: Coercing text to numeric in E3146 / R3146C5: '2'
## Warning: Coercing text to numeric in E3147 / R3147C5: '2'
## Warning: Coercing text to numeric in E3148 / R3148C5: '2'
## Warning: Coercing text to numeric in E3149 / R3149C5: '2'
## Warning: Coercing text to numeric in E3150 / R3150C5: '2'
## Warning: Coercing text to numeric in E3151 / R3151C5: '2'
## Warning: Coercing text to numeric in E3152 / R3152C5: '2'
## Warning: Coercing text to numeric in E3153 / R3153C5: '2'
## Warning: Coercing text to numeric in E3154 / R3154C5: '2'
## Warning: Coercing text to numeric in E3155 / R3155C5: '2'
## Warning: Coercing text to numeric in E3156 / R3156C5: '2'
## Warning: Coercing text to numeric in E3157 / R3157C5: '2'
## Warning: Coercing text to numeric in E3158 / R3158C5: '2'
## Warning: Coercing text to numeric in E3159 / R3159C5: '2'
## Warning: Coercing text to numeric in E3160 / R3160C5: '2'
## Warning: Coercing text to numeric in E3161 / R3161C5: '2'
## Warning: Coercing text to numeric in E3162 / R3162C5: '2'
## Warning: Coercing text to numeric in E3163 / R3163C5: '2'
## Warning: Coercing text to numeric in E3164 / R3164C5: '2'
## Warning: Coercing text to numeric in E3165 / R3165C5: '2'
## Warning: Coercing text to numeric in E3166 / R3166C5: '2'
## Warning: Coercing text to numeric in E3167 / R3167C5: '2'
## Warning: Coercing text to numeric in E3168 / R3168C5: '2'
## Warning: Coercing text to numeric in E3169 / R3169C5: '2'
## Warning: Coercing text to numeric in E3170 / R3170C5: '2'
## Warning: Coercing text to numeric in E3171 / R3171C5: '2'
## Warning: Coercing text to numeric in E3172 / R3172C5: '2'
## Warning: Coercing text to numeric in E3173 / R3173C5: '2'
## Warning: Coercing text to numeric in E3174 / R3174C5: '2'
## Warning: Coercing text to numeric in E3175 / R3175C5: '2'
## Warning: Coercing text to numeric in E3176 / R3176C5: '2'
## Warning: Coercing text to numeric in E3177 / R3177C5: '2'
## Warning: Coercing text to numeric in E3178 / R3178C5: '2'
## Warning: Coercing text to numeric in E3179 / R3179C5: '2'
## Warning: Coercing text to numeric in E3180 / R3180C5: '2'
## Warning: Coercing text to numeric in E3181 / R3181C5: '2'
## Warning: Coercing text to numeric in E3182 / R3182C5: '1'
## Warning: Coercing text to numeric in E3183 / R3183C5: '1'
## Warning: Coercing text to numeric in E3184 / R3184C5: '1'
## Warning: Coercing text to numeric in E3185 / R3185C5: '1'
## Warning: Coercing text to numeric in E3186 / R3186C5: '1'
## Warning: Coercing text to numeric in E3187 / R3187C5: '1'
## Warning: Coercing text to numeric in E3188 / R3188C5: '1'
## Warning: Coercing text to numeric in E3189 / R3189C5: '1'
## Warning: Coercing text to numeric in E3190 / R3190C5: '1'
## Warning: Coercing text to numeric in E3191 / R3191C5: '1'
## Warning: Coercing text to numeric in E3192 / R3192C5: '1'
## Warning: Coercing text to numeric in E3193 / R3193C5: '1'
## Warning: Coercing text to numeric in E3194 / R3194C5: '1'
## Warning: Coercing text to numeric in E3195 / R3195C5: '1'
## Warning: Coercing text to numeric in E3196 / R3196C5: '1'
## Warning: Coercing text to numeric in E3197 / R3197C5: '1'
## Warning: Coercing text to numeric in E3198 / R3198C5: '1'
## Warning: Coercing text to numeric in E3199 / R3199C5: '1'
## Warning: Coercing text to numeric in E3200 / R3200C5: '2'
## Warning: Coercing text to numeric in E3201 / R3201C5: '2'
## Warning: Coercing text to numeric in E3202 / R3202C5: '2'
## Warning: Coercing text to numeric in E3203 / R3203C5: '2'
## Warning: Coercing text to numeric in E3204 / R3204C5: '2'
## Warning: Coercing text to numeric in E3205 / R3205C5: '2'
## Warning: Coercing text to numeric in E3206 / R3206C5: '2'
## Warning: Coercing text to numeric in E3207 / R3207C5: '2'
## Warning: Coercing text to numeric in E3208 / R3208C5: '2'
## Warning: Coercing text to numeric in E3209 / R3209C5: '2'
## Warning: Coercing text to numeric in E3210 / R3210C5: '2'
## Warning: Coercing text to numeric in E3211 / R3211C5: '2'
## Warning: Coercing text to numeric in E3212 / R3212C5: '1'
## Warning: Coercing text to numeric in E3213 / R3213C5: '1'
## Warning: Coercing text to numeric in E3214 / R3214C5: '1'
## Warning: Coercing text to numeric in E3215 / R3215C5: '1'
## Warning: Coercing text to numeric in E3216 / R3216C5: '1'
## Warning: Coercing text to numeric in E3217 / R3217C5: '1'
## Warning: Coercing text to numeric in E3218 / R3218C5: '2'
## Warning: Coercing text to numeric in E3219 / R3219C5: '2'
## Warning: Coercing text to numeric in E3220 / R3220C5: '2'
## Warning: Coercing text to numeric in E3221 / R3221C5: '2'
## Warning: Coercing text to numeric in E3222 / R3222C5: '2'
## Warning: Coercing text to numeric in E3223 / R3223C5: '2'
## Warning: Coercing text to numeric in E3224 / R3224C5: '2'
## Warning: Coercing text to numeric in E3225 / R3225C5: '2'
## Warning: Coercing text to numeric in E3226 / R3226C5: '2'
## Warning: Coercing text to numeric in E3227 / R3227C5: '2'
## Warning: Coercing text to numeric in E3228 / R3228C5: '2'
## Warning: Coercing text to numeric in E3229 / R3229C5: '2'
## Warning: Coercing text to numeric in E3230 / R3230C5: '2'
## Warning: Coercing text to numeric in E3231 / R3231C5: '2'
## Warning: Coercing text to numeric in E3232 / R3232C5: '2'
## Warning: Coercing text to numeric in E3233 / R3233C5: '2'
## Warning: Coercing text to numeric in E3234 / R3234C5: '2'
## Warning: Coercing text to numeric in E3235 / R3235C5: '2'
## Warning: Coercing text to numeric in E3236 / R3236C5: '2'
## Warning: Coercing text to numeric in E3237 / R3237C5: '2'
## Warning: Coercing text to numeric in E3238 / R3238C5: '2'
## Warning: Coercing text to numeric in E3239 / R3239C5: '2'
## Warning: Coercing text to numeric in E3240 / R3240C5: '2'
## Warning: Coercing text to numeric in E3241 / R3241C5: '2'
## Warning: Coercing text to numeric in E3242 / R3242C5: '2'
## Warning: Coercing text to numeric in E3243 / R3243C5: '2'
## Warning: Coercing text to numeric in E3244 / R3244C5: '2'
## Warning: Coercing text to numeric in E3245 / R3245C5: '2'
## Warning: Coercing text to numeric in E3246 / R3246C5: '2'
## Warning: Coercing text to numeric in E3247 / R3247C5: '2'
## Warning: Coercing text to numeric in E3248 / R3248C5: '2'
## Warning: Coercing text to numeric in E3249 / R3249C5: '2'
## Warning: Coercing text to numeric in E3250 / R3250C5: '2'
## Warning: Coercing text to numeric in E3251 / R3251C5: '2'
## Warning: Coercing text to numeric in E3252 / R3252C5: '2'
## Warning: Coercing text to numeric in E3253 / R3253C5: '2'
## Warning: Coercing text to numeric in E3254 / R3254C5: '1'
## Warning: Coercing text to numeric in E3255 / R3255C5: '1'
## Warning: Coercing text to numeric in E3256 / R3256C5: '1'
## Warning: Coercing text to numeric in E3257 / R3257C5: '1'
## Warning: Coercing text to numeric in E3258 / R3258C5: '1'
## Warning: Coercing text to numeric in E3259 / R3259C5: '1'
## Warning: Coercing text to numeric in E3260 / R3260C5: '1'
## Warning: Coercing text to numeric in E3261 / R3261C5: '1'
## Warning: Coercing text to numeric in E3262 / R3262C5: '1'
## Warning: Coercing text to numeric in E3263 / R3263C5: '1'
## Warning: Coercing text to numeric in E3264 / R3264C5: '1'
## Warning: Coercing text to numeric in E3265 / R3265C5: '1'
## Warning: Coercing text to numeric in E3266 / R3266C5: '1'
## Warning: Coercing text to numeric in E3267 / R3267C5: '1'
## Warning: Coercing text to numeric in E3268 / R3268C5: '1'
## Warning: Coercing text to numeric in E3269 / R3269C5: '1'
## Warning: Coercing text to numeric in E3270 / R3270C5: '1'
## Warning: Coercing text to numeric in E3271 / R3271C5: '1'
## Warning: Coercing text to numeric in E3272 / R3272C5: '1'
## Warning: Coercing text to numeric in E3273 / R3273C5: '1'
## Warning: Coercing text to numeric in E3274 / R3274C5: '1'
## Warning: Coercing text to numeric in E3275 / R3275C5: '1'
## Warning: Coercing text to numeric in E3276 / R3276C5: '1'
## Warning: Coercing text to numeric in E3277 / R3277C5: '1'
## Warning: Coercing text to numeric in E3278 / R3278C5: '2'
## Warning: Coercing text to numeric in E3279 / R3279C5: '2'
## Warning: Coercing text to numeric in E3280 / R3280C5: '2'
## Warning: Coercing text to numeric in E3281 / R3281C5: '2'
## Warning: Coercing text to numeric in E3282 / R3282C5: '2'
## Warning: Coercing text to numeric in E3283 / R3283C5: '2'
## Warning: Coercing text to numeric in E3284 / R3284C5: '2'
## Warning: Coercing text to numeric in E3285 / R3285C5: '2'
## Warning: Coercing text to numeric in E3286 / R3286C5: '2'
## Warning: Coercing text to numeric in E3287 / R3287C5: '2'
## Warning: Coercing text to numeric in E3288 / R3288C5: '2'
## Warning: Coercing text to numeric in E3289 / R3289C5: '2'
## Warning: Coercing text to numeric in E3290 / R3290C5: '2'
## Warning: Coercing text to numeric in E3291 / R3291C5: '2'
## Warning: Coercing text to numeric in E3292 / R3292C5: '2'
## Warning: Coercing text to numeric in E3293 / R3293C5: '2'
## Warning: Coercing text to numeric in E3294 / R3294C5: '2'
## Warning: Coercing text to numeric in E3295 / R3295C5: '2'
## Warning: Coercing text to numeric in E3296 / R3296C5: '1'
## Warning: Coercing text to numeric in E3297 / R3297C5: '1'
## Warning: Coercing text to numeric in E3298 / R3298C5: '1'
## Warning: Coercing text to numeric in E3299 / R3299C5: '1'
## Warning: Coercing text to numeric in E3300 / R3300C5: '1'
## Warning: Coercing text to numeric in E3301 / R3301C5: '1'
## Warning: Coercing text to numeric in E3302 / R3302C5: '2'
## Warning: Coercing text to numeric in E3303 / R3303C5: '2'
## Warning: Coercing text to numeric in E3304 / R3304C5: '2'
## Warning: Coercing text to numeric in E3305 / R3305C5: '2'
## Warning: Coercing text to numeric in E3306 / R3306C5: '2'
## Warning: Coercing text to numeric in E3307 / R3307C5: '2'
## Warning: Coercing text to numeric in E3308 / R3308C5: '2'
## Warning: Coercing text to numeric in E3309 / R3309C5: '2'
## Warning: Coercing text to numeric in E3310 / R3310C5: '2'
## Warning: Coercing text to numeric in E3311 / R3311C5: '2'
## Warning: Coercing text to numeric in E3312 / R3312C5: '2'
## Warning: Coercing text to numeric in E3313 / R3313C5: '2'
## Warning: Coercing text to numeric in E3314 / R3314C5: '2'
## Warning: Coercing text to numeric in E3315 / R3315C5: '2'
## Warning: Coercing text to numeric in E3316 / R3316C5: '2'
## Warning: Coercing text to numeric in E3317 / R3317C5: '2'
## Warning: Coercing text to numeric in E3318 / R3318C5: '2'
## Warning: Coercing text to numeric in E3319 / R3319C5: '2'
## Warning: Coercing text to numeric in E3320 / R3320C5: '2'
## Warning: Coercing text to numeric in E3321 / R3321C5: '2'
## Warning: Coercing text to numeric in E3322 / R3322C5: '2'
## Warning: Coercing text to numeric in E3323 / R3323C5: '2'
## Warning: Coercing text to numeric in E3324 / R3324C5: '2'
## Warning: Coercing text to numeric in E3325 / R3325C5: '2'
## Warning: Coercing text to numeric in E3326 / R3326C5: '1'
## Warning: Coercing text to numeric in E3327 / R3327C5: '1'
## Warning: Coercing text to numeric in E3328 / R3328C5: '1'
## Warning: Coercing text to numeric in E3329 / R3329C5: '1'
## Warning: Coercing text to numeric in E3330 / R3330C5: '1'
## Warning: Coercing text to numeric in E3331 / R3331C5: '1'
## Warning: Coercing text to numeric in E3332 / R3332C5: '2'
## Warning: Coercing text to numeric in E3333 / R3333C5: '2'
## Warning: Coercing text to numeric in E3334 / R3334C5: '2'
## Warning: Coercing text to numeric in E3335 / R3335C5: '2'
## Warning: Coercing text to numeric in E3336 / R3336C5: '2'
## Warning: Coercing text to numeric in E3337 / R3337C5: '2'
## Warning: Coercing text to numeric in E3338 / R3338C5: '2'
## Warning: Coercing text to numeric in E3339 / R3339C5: '2'
## Warning: Coercing text to numeric in E3340 / R3340C5: '2'
## Warning: Coercing text to numeric in E3341 / R3341C5: '2'
## Warning: Coercing text to numeric in E3342 / R3342C5: '2'
## Warning: Coercing text to numeric in E3343 / R3343C5: '2'
## Warning: Coercing text to numeric in E3344 / R3344C5: '1'
## Warning: Coercing text to numeric in E3345 / R3345C5: '1'
## Warning: Coercing text to numeric in E3346 / R3346C5: '1'
## Warning: Coercing text to numeric in E3347 / R3347C5: '1'
## Warning: Coercing text to numeric in E3348 / R3348C5: '1'
## Warning: Coercing text to numeric in E3349 / R3349C5: '1'
## Warning: Coercing text to numeric in E3350 / R3350C5: '2'
## Warning: Coercing text to numeric in E3351 / R3351C5: '2'
## Warning: Coercing text to numeric in E3352 / R3352C5: '2'
## Warning: Coercing text to numeric in E3353 / R3353C5: '2'
## Warning: Coercing text to numeric in E3354 / R3354C5: '2'
## Warning: Coercing text to numeric in E3355 / R3355C5: '2'
## Warning: Coercing text to numeric in E3356 / R3356C5: '2'
## Warning: Coercing text to numeric in E3357 / R3357C5: '2'
## Warning: Coercing text to numeric in E3358 / R3358C5: '2'
## Warning: Coercing text to numeric in E3359 / R3359C5: '2'
## Warning: Coercing text to numeric in E3360 / R3360C5: '2'
## Warning: Coercing text to numeric in E3361 / R3361C5: '2'
## Warning: Coercing text to numeric in E3362 / R3362C5: '1'
## Warning: Coercing text to numeric in E3363 / R3363C5: '1'
## Warning: Coercing text to numeric in E3364 / R3364C5: '1'
## Warning: Coercing text to numeric in E3365 / R3365C5: '1'
## Warning: Coercing text to numeric in E3366 / R3366C5: '1'
## Warning: Coercing text to numeric in E3367 / R3367C5: '1'
## Warning: Coercing text to numeric in E3368 / R3368C5: '1'
## Warning: Coercing text to numeric in E3369 / R3369C5: '1'
## Warning: Coercing text to numeric in E3370 / R3370C5: '1'
## Warning: Coercing text to numeric in E3371 / R3371C5: '1'
## Warning: Coercing text to numeric in E3372 / R3372C5: '1'
## Warning: Coercing text to numeric in E3373 / R3373C5: '1'
## Warning: Coercing text to numeric in E3374 / R3374C5: '1'
## Warning: Coercing text to numeric in E3375 / R3375C5: '1'
## Warning: Coercing text to numeric in E3376 / R3376C5: '1'
## Warning: Coercing text to numeric in E3377 / R3377C5: '1'
## Warning: Coercing text to numeric in E3378 / R3378C5: '1'
## Warning: Coercing text to numeric in E3379 / R3379C5: '1'
## Warning: Coercing text to numeric in E3380 / R3380C5: '2'
## Warning: Coercing text to numeric in E3381 / R3381C5: '2'
## Warning: Coercing text to numeric in E3382 / R3382C5: '2'
## Warning: Coercing text to numeric in E3383 / R3383C5: '2'
## Warning: Coercing text to numeric in E3384 / R3384C5: '2'
## Warning: Coercing text to numeric in E3385 / R3385C5: '2'
## Warning: Coercing text to numeric in E3386 / R3386C5: '1'
## Warning: Coercing text to numeric in E3387 / R3387C5: '1'
## Warning: Coercing text to numeric in E3388 / R3388C5: '1'
## Warning: Coercing text to numeric in E3389 / R3389C5: '1'
## Warning: Coercing text to numeric in E3390 / R3390C5: '1'
## Warning: Coercing text to numeric in E3391 / R3391C5: '1'
## Warning: Coercing text to numeric in E3392 / R3392C5: '1'
## Warning: Coercing text to numeric in E3393 / R3393C5: '1'
## Warning: Coercing text to numeric in E3394 / R3394C5: '1'
## Warning: Coercing text to numeric in E3395 / R3395C5: '1'
## Warning: Coercing text to numeric in E3396 / R3396C5: '1'
## Warning: Coercing text to numeric in E3397 / R3397C5: '1'
## Warning: Coercing text to numeric in E3398 / R3398C5: '1'
## Warning: Coercing text to numeric in E3399 / R3399C5: '1'
## Warning: Coercing text to numeric in E3400 / R3400C5: '1'
## Warning: Coercing text to numeric in E3401 / R3401C5: '1'
## Warning: Coercing text to numeric in E3402 / R3402C5: '1'
## Warning: Coercing text to numeric in E3403 / R3403C5: '1'
## Warning: Coercing text to numeric in E3404 / R3404C5: '2'
## Warning: Coercing text to numeric in E3405 / R3405C5: '2'
## Warning: Coercing text to numeric in E3406 / R3406C5: '2'
## Warning: Coercing text to numeric in E3407 / R3407C5: '2'
## Warning: Coercing text to numeric in E3408 / R3408C5: '2'
## Warning: Coercing text to numeric in E3409 / R3409C5: '2'
## Warning: Coercing text to numeric in E3410 / R3410C5: '2'
## Warning: Coercing text to numeric in E3411 / R3411C5: '2'
## Warning: Coercing text to numeric in E3412 / R3412C5: '2'
## Warning: Coercing text to numeric in E3413 / R3413C5: '2'
## Warning: Coercing text to numeric in E3414 / R3414C5: '2'
## Warning: Coercing text to numeric in E3415 / R3415C5: '2'
## Warning: Coercing text to numeric in E3416 / R3416C5: '2'
## Warning: Coercing text to numeric in E3417 / R3417C5: '2'
## Warning: Coercing text to numeric in E3418 / R3418C5: '2'
## Warning: Coercing text to numeric in E3419 / R3419C5: '2'
## Warning: Coercing text to numeric in E3420 / R3420C5: '2'
## Warning: Coercing text to numeric in E3421 / R3421C5: '2'
## Warning: Coercing text to numeric in E3422 / R3422C5: '2'
## Warning: Coercing text to numeric in E3423 / R3423C5: '2'
## Warning: Coercing text to numeric in E3424 / R3424C5: '2'
## Warning: Coercing text to numeric in E3425 / R3425C5: '2'
## Warning: Coercing text to numeric in E3426 / R3426C5: '2'
## Warning: Coercing text to numeric in E3427 / R3427C5: '2'
## Warning: Coercing text to numeric in E3428 / R3428C5: '1'
## Warning: Coercing text to numeric in E3429 / R3429C5: '1'
## Warning: Coercing text to numeric in E3430 / R3430C5: '1'
## Warning: Coercing text to numeric in E3431 / R3431C5: '1'
## Warning: Coercing text to numeric in E3432 / R3432C5: '1'
## Warning: Coercing text to numeric in E3433 / R3433C5: '1'
## Warning: Coercing text to numeric in E3434 / R3434C5: '1'
## Warning: Coercing text to numeric in E3435 / R3435C5: '1'
## Warning: Coercing text to numeric in E3436 / R3436C5: '1'
## Warning: Coercing text to numeric in E3437 / R3437C5: '1'
## Warning: Coercing text to numeric in E3438 / R3438C5: '1'
## Warning: Coercing text to numeric in E3439 / R3439C5: '1'
## Warning: Coercing text to numeric in E3440 / R3440C5: '2'
## Warning: Coercing text to numeric in E3441 / R3441C5: '2'
## Warning: Coercing text to numeric in E3442 / R3442C5: '2'
## Warning: Coercing text to numeric in E3443 / R3443C5: '2'
## Warning: Coercing text to numeric in E3444 / R3444C5: '2'
## Warning: Coercing text to numeric in E3445 / R3445C5: '2'
## Warning: Coercing text to numeric in E3446 / R3446C5: '2'
## Warning: Coercing text to numeric in E3447 / R3447C5: '2'
## Warning: Coercing text to numeric in E3448 / R3448C5: '2'
## Warning: Coercing text to numeric in E3449 / R3449C5: '2'
## Warning: Coercing text to numeric in E3450 / R3450C5: '2'
## Warning: Coercing text to numeric in E3451 / R3451C5: '2'
## Warning: Coercing text to numeric in E3452 / R3452C5: '2'
## Warning: Coercing text to numeric in E3453 / R3453C5: '2'
## Warning: Coercing text to numeric in E3454 / R3454C5: '2'
## Warning: Coercing text to numeric in E3455 / R3455C5: '2'
## Warning: Coercing text to numeric in E3456 / R3456C5: '2'
## Warning: Coercing text to numeric in E3457 / R3457C5: '2'
## Warning: Coercing text to numeric in E3458 / R3458C5: '2'
## Warning: Coercing text to numeric in E3459 / R3459C5: '2'
## Warning: Coercing text to numeric in E3460 / R3460C5: '2'
## Warning: Coercing text to numeric in E3461 / R3461C5: '2'
## Warning: Coercing text to numeric in E3462 / R3462C5: '2'
## Warning: Coercing text to numeric in E3463 / R3463C5: '2'
## Warning: Coercing text to numeric in E3464 / R3464C5: '1'
## Warning: Coercing text to numeric in E3465 / R3465C5: '1'
## Warning: Coercing text to numeric in E3466 / R3466C5: '1'
## Warning: Coercing text to numeric in E3467 / R3467C5: '1'
## Warning: Coercing text to numeric in E3468 / R3468C5: '1'
## Warning: Coercing text to numeric in E3469 / R3469C5: '1'
## Warning: Coercing text to numeric in E3470 / R3470C5: '2'
## Warning: Coercing text to numeric in E3471 / R3471C5: '2'
## Warning: Coercing text to numeric in E3472 / R3472C5: '2'
## Warning: Coercing text to numeric in E3473 / R3473C5: '2'
## Warning: Coercing text to numeric in E3474 / R3474C5: '2'
## Warning: Coercing text to numeric in E3475 / R3475C5: '2'
## Warning: Coercing text to numeric in E3476 / R3476C5: '1'
## Warning: Coercing text to numeric in E3477 / R3477C5: '1'
## Warning: Coercing text to numeric in E3478 / R3478C5: '1'
## Warning: Coercing text to numeric in E3479 / R3479C5: '1'
## Warning: Coercing text to numeric in E3480 / R3480C5: '1'
## Warning: Coercing text to numeric in E3481 / R3481C5: '1'
## Warning: Coercing text to numeric in E3482 / R3482C5: '2'
## Warning: Coercing text to numeric in E3483 / R3483C5: '2'
## Warning: Coercing text to numeric in E3484 / R3484C5: '2'
## Warning: Coercing text to numeric in E3485 / R3485C5: '2'
## Warning: Coercing text to numeric in E3486 / R3486C5: '2'
## Warning: Coercing text to numeric in E3487 / R3487C5: '2'
## Warning: Coercing text to numeric in E3488 / R3488C5: '1'
## Warning: Coercing text to numeric in E3489 / R3489C5: '1'
## Warning: Coercing text to numeric in E3490 / R3490C5: '1'
## Warning: Coercing text to numeric in E3491 / R3491C5: '1'
## Warning: Coercing text to numeric in E3492 / R3492C5: '1'
## Warning: Coercing text to numeric in E3493 / R3493C5: '1'
## Warning: Coercing text to numeric in E3494 / R3494C5: '1'
## Warning: Coercing text to numeric in E3495 / R3495C5: '1'
## Warning: Coercing text to numeric in E3496 / R3496C5: '1'
## Warning: Coercing text to numeric in E3497 / R3497C5: '1'
## Warning: Coercing text to numeric in E3498 / R3498C5: '1'
## Warning: Coercing text to numeric in E3499 / R3499C5: '1'
## Warning: Coercing text to numeric in E3500 / R3500C5: '1'
## Warning: Coercing text to numeric in E3501 / R3501C5: '1'
## Warning: Coercing text to numeric in E3502 / R3502C5: '1'
## Warning: Coercing text to numeric in E3503 / R3503C5: '1'
## Warning: Coercing text to numeric in E3504 / R3504C5: '1'
## Warning: Coercing text to numeric in E3505 / R3505C5: '1'
## Warning: Coercing text to numeric in E3506 / R3506C5: '1'
## Warning: Coercing text to numeric in E3507 / R3507C5: '1'
## Warning: Coercing text to numeric in E3508 / R3508C5: '1'
## Warning: Coercing text to numeric in E3509 / R3509C5: '1'
## Warning: Coercing text to numeric in E3510 / R3510C5: '1'
## Warning: Coercing text to numeric in E3511 / R3511C5: '1'
## Warning: Coercing text to numeric in E3512 / R3512C5: '1'
## Warning: Coercing text to numeric in E3513 / R3513C5: '1'
## Warning: Coercing text to numeric in E3514 / R3514C5: '1'
## Warning: Coercing text to numeric in E3515 / R3515C5: '1'
## Warning: Coercing text to numeric in E3516 / R3516C5: '1'
## Warning: Coercing text to numeric in E3517 / R3517C5: '1'
## Warning: Coercing text to numeric in E3518 / R3518C5: '1'
## Warning: Coercing text to numeric in E3519 / R3519C5: '1'
## Warning: Coercing text to numeric in E3520 / R3520C5: '1'
## Warning: Coercing text to numeric in E3521 / R3521C5: '1'
## Warning: Coercing text to numeric in E3522 / R3522C5: '1'
## Warning: Coercing text to numeric in E3523 / R3523C5: '1'
## Warning: Coercing text to numeric in E3524 / R3524C5: '1'
## Warning: Coercing text to numeric in E3525 / R3525C5: '1'
## Warning: Coercing text to numeric in E3526 / R3526C5: '1'
## Warning: Coercing text to numeric in E3527 / R3527C5: '1'
## Warning: Coercing text to numeric in E3528 / R3528C5: '1'
## Warning: Coercing text to numeric in E3529 / R3529C5: '1'
## Warning: Coercing text to numeric in E3530 / R3530C5: '2'
## Warning: Coercing text to numeric in E3531 / R3531C5: '2'
## Warning: Coercing text to numeric in E3532 / R3532C5: '2'
## Warning: Coercing text to numeric in E3533 / R3533C5: '2'
## Warning: Coercing text to numeric in E3534 / R3534C5: '2'
## Warning: Coercing text to numeric in E3535 / R3535C5: '2'
## Warning: Coercing text to numeric in E3536 / R3536C5: '2'
## Warning: Coercing text to numeric in E3537 / R3537C5: '2'
## Warning: Coercing text to numeric in E3538 / R3538C5: '2'
## Warning: Coercing text to numeric in E3539 / R3539C5: '2'
## Warning: Coercing text to numeric in E3540 / R3540C5: '2'
## Warning: Coercing text to numeric in E3541 / R3541C5: '2'
## Warning: Coercing text to numeric in E3542 / R3542C5: '2'
## Warning: Coercing text to numeric in E3543 / R3543C5: '2'
## Warning: Coercing text to numeric in E3544 / R3544C5: '2'
## Warning: Coercing text to numeric in E3545 / R3545C5: '2'
## Warning: Coercing text to numeric in E3546 / R3546C5: '2'
## Warning: Coercing text to numeric in E3547 / R3547C5: '2'
## Warning: Coercing text to numeric in E3548 / R3548C5: '2'
## Warning: Coercing text to numeric in E3549 / R3549C5: '2'
## Warning: Coercing text to numeric in E3550 / R3550C5: '2'
## Warning: Coercing text to numeric in E3551 / R3551C5: '2'
## Warning: Coercing text to numeric in E3552 / R3552C5: '2'
## Warning: Coercing text to numeric in E3553 / R3553C5: '2'
## Warning: Coercing text to numeric in E3554 / R3554C5: '1'
## Warning: Coercing text to numeric in E3555 / R3555C5: '1'
## Warning: Coercing text to numeric in E3556 / R3556C5: '1'
## Warning: Coercing text to numeric in E3557 / R3557C5: '1'
## Warning: Coercing text to numeric in E3558 / R3558C5: '1'
## Warning: Coercing text to numeric in E3559 / R3559C5: '1'
## Warning: Coercing text to numeric in E3560 / R3560C5: '1'
## Warning: Coercing text to numeric in E3561 / R3561C5: '1'
## Warning: Coercing text to numeric in E3562 / R3562C5: '1'
## Warning: Coercing text to numeric in E3563 / R3563C5: '1'
## Warning: Coercing text to numeric in E3564 / R3564C5: '1'
## Warning: Coercing text to numeric in E3565 / R3565C5: '1'
## Warning: Coercing text to numeric in E3566 / R3566C5: '2'
## Warning: Coercing text to numeric in E3567 / R3567C5: '2'
## Warning: Coercing text to numeric in E3568 / R3568C5: '2'
## Warning: Coercing text to numeric in E3569 / R3569C5: '2'
## Warning: Coercing text to numeric in E3570 / R3570C5: '2'
## Warning: Coercing text to numeric in E3571 / R3571C5: '2'
## Warning: Coercing text to numeric in E3572 / R3572C5: '1'
## Warning: Coercing text to numeric in E3573 / R3573C5: '1'
## Warning: Coercing text to numeric in E3574 / R3574C5: '1'
## Warning: Coercing text to numeric in E3575 / R3575C5: '1'
## Warning: Coercing text to numeric in E3576 / R3576C5: '1'
## Warning: Coercing text to numeric in E3577 / R3577C5: '1'
## Warning: Coercing text to numeric in E3578 / R3578C5: '1'
## Warning: Coercing text to numeric in E3579 / R3579C5: '1'
## Warning: Coercing text to numeric in E3580 / R3580C5: '1'
## Warning: Coercing text to numeric in E3581 / R3581C5: '1'
## Warning: Coercing text to numeric in E3582 / R3582C5: '1'
## Warning: Coercing text to numeric in E3583 / R3583C5: '1'
## Warning: Coercing text to numeric in E3584 / R3584C5: '1'
## Warning: Coercing text to numeric in E3585 / R3585C5: '1'
## Warning: Coercing text to numeric in E3586 / R3586C5: '1'
## Warning: Coercing text to numeric in E3587 / R3587C5: '1'
## Warning: Coercing text to numeric in E3588 / R3588C5: '1'
## Warning: Coercing text to numeric in E3589 / R3589C5: '1'
## Warning: Coercing text to numeric in E3590 / R3590C5: '1'
## Warning: Coercing text to numeric in E3591 / R3591C5: '1'
## Warning: Coercing text to numeric in E3592 / R3592C5: '1'
## Warning: Coercing text to numeric in E3593 / R3593C5: '1'
## Warning: Coercing text to numeric in E3594 / R3594C5: '1'
## Warning: Coercing text to numeric in E3595 / R3595C5: '1'
## Warning: Coercing text to numeric in E3596 / R3596C5: '2'
## Warning: Coercing text to numeric in E3597 / R3597C5: '2'
## Warning: Coercing text to numeric in E3598 / R3598C5: '2'
## Warning: Coercing text to numeric in E3599 / R3599C5: '2'
## Warning: Coercing text to numeric in E3600 / R3600C5: '2'
## Warning: Coercing text to numeric in E3601 / R3601C5: '2'
## Warning: Coercing text to numeric in E3602 / R3602C5: '2'
## Warning: Coercing text to numeric in E3603 / R3603C5: '2'
## Warning: Coercing text to numeric in E3604 / R3604C5: '2'
## Warning: Coercing text to numeric in E3605 / R3605C5: '2'
## Warning: Coercing text to numeric in E3606 / R3606C5: '2'
## Warning: Coercing text to numeric in E3607 / R3607C5: '2'
## Warning: Coercing text to numeric in E3608 / R3608C5: '2'
## Warning: Coercing text to numeric in E3609 / R3609C5: '2'
## Warning: Coercing text to numeric in E3610 / R3610C5: '2'
## Warning: Coercing text to numeric in E3611 / R3611C5: '2'
## Warning: Coercing text to numeric in E3612 / R3612C5: '2'
## Warning: Coercing text to numeric in E3613 / R3613C5: '2'
## Warning: Coercing text to numeric in E3614 / R3614C5: '1'
## Warning: Coercing text to numeric in E3615 / R3615C5: '1'
## Warning: Coercing text to numeric in E3616 / R3616C5: '1'
## Warning: Coercing text to numeric in E3617 / R3617C5: '1'
## Warning: Coercing text to numeric in E3618 / R3618C5: '1'
## Warning: Coercing text to numeric in E3619 / R3619C5: '1'
## Warning: Coercing text to numeric in E3620 / R3620C5: '1'
## Warning: Coercing text to numeric in E3621 / R3621C5: '1'
## Warning: Coercing text to numeric in E3622 / R3622C5: '1'
## Warning: Coercing text to numeric in E3623 / R3623C5: '1'
## Warning: Coercing text to numeric in E3624 / R3624C5: '1'
## Warning: Coercing text to numeric in E3625 / R3625C5: '1'
## Warning: Coercing text to numeric in E3626 / R3626C5: '2'
## Warning: Coercing text to numeric in E3627 / R3627C5: '2'
## Warning: Coercing text to numeric in E3628 / R3628C5: '2'
## Warning: Coercing text to numeric in E3629 / R3629C5: '2'
## Warning: Coercing text to numeric in E3630 / R3630C5: '2'
## Warning: Coercing text to numeric in E3631 / R3631C5: '2'
## Warning: Coercing text to numeric in E3632 / R3632C5: '2'
## Warning: Coercing text to numeric in E3633 / R3633C5: '2'
## Warning: Coercing text to numeric in E3634 / R3634C5: '2'
## Warning: Coercing text to numeric in E3635 / R3635C5: '2'
## Warning: Coercing text to numeric in E3636 / R3636C5: '2'
## Warning: Coercing text to numeric in E3637 / R3637C5: '2'
## Warning: Coercing text to numeric in E3638 / R3638C5: '2'
## Warning: Coercing text to numeric in E3639 / R3639C5: '2'
## Warning: Coercing text to numeric in E3640 / R3640C5: '2'
## Warning: Coercing text to numeric in E3641 / R3641C5: '2'
## Warning: Coercing text to numeric in E3642 / R3642C5: '2'
## Warning: Coercing text to numeric in E3643 / R3643C5: '2'
## Warning: Coercing text to numeric in E3644 / R3644C5: '2'
## Warning: Coercing text to numeric in E3645 / R3645C5: '2'
## Warning: Coercing text to numeric in E3646 / R3646C5: '2'
## Warning: Coercing text to numeric in E3647 / R3647C5: '2'
## Warning: Coercing text to numeric in E3648 / R3648C5: '2'
## Warning: Coercing text to numeric in E3649 / R3649C5: '2'
## Warning: Coercing text to numeric in E3650 / R3650C5: '1'
## Warning: Coercing text to numeric in E3651 / R3651C5: '1'
## Warning: Coercing text to numeric in E3652 / R3652C5: '1'
## Warning: Coercing text to numeric in E3653 / R3653C5: '1'
## Warning: Coercing text to numeric in E3654 / R3654C5: '1'
## Warning: Coercing text to numeric in E3655 / R3655C5: '1'
## Warning: Coercing text to numeric in E3656 / R3656C5: '1'
## Warning: Coercing text to numeric in E3657 / R3657C5: '1'
## Warning: Coercing text to numeric in E3658 / R3658C5: '1'
## Warning: Coercing text to numeric in E3659 / R3659C5: '1'
## Warning: Coercing text to numeric in E3660 / R3660C5: '1'
## Warning: Coercing text to numeric in E3661 / R3661C5: '1'
## Warning: Coercing text to numeric in E3662 / R3662C5: '2'
## Warning: Coercing text to numeric in E3663 / R3663C5: '2'
## Warning: Coercing text to numeric in E3664 / R3664C5: '2'
## Warning: Coercing text to numeric in E3665 / R3665C5: '2'
## Warning: Coercing text to numeric in E3666 / R3666C5: '2'
## Warning: Coercing text to numeric in E3667 / R3667C5: '2'
## Warning: Coercing text to numeric in E3668 / R3668C5: '2'
## Warning: Coercing text to numeric in E3669 / R3669C5: '2'
## Warning: Coercing text to numeric in E3670 / R3670C5: '2'
## Warning: Coercing text to numeric in E3671 / R3671C5: '2'
## Warning: Coercing text to numeric in E3672 / R3672C5: '2'
## Warning: Coercing text to numeric in E3673 / R3673C5: '2'
## Warning: Coercing text to numeric in E3674 / R3674C5: '2'
## Warning: Coercing text to numeric in E3675 / R3675C5: '2'
## Warning: Coercing text to numeric in E3676 / R3676C5: '2'
## Warning: Coercing text to numeric in E3677 / R3677C5: '2'
## Warning: Coercing text to numeric in E3678 / R3678C5: '2'
## Warning: Coercing text to numeric in E3679 / R3679C5: '2'
## Warning: Coercing text to numeric in E3680 / R3680C5: '1'
## Warning: Coercing text to numeric in E3681 / R3681C5: '1'
## Warning: Coercing text to numeric in E3682 / R3682C5: '1'
## Warning: Coercing text to numeric in E3683 / R3683C5: '1'
## Warning: Coercing text to numeric in E3684 / R3684C5: '1'
## Warning: Coercing text to numeric in E3685 / R3685C5: '1'
## Warning: Coercing text to numeric in E3686 / R3686C5: '2'
## Warning: Coercing text to numeric in E3687 / R3687C5: '2'
## Warning: Coercing text to numeric in E3688 / R3688C5: '2'
## Warning: Coercing text to numeric in E3689 / R3689C5: '2'
## Warning: Coercing text to numeric in E3690 / R3690C5: '2'
## Warning: Coercing text to numeric in E3691 / R3691C5: '2'
## Warning: Coercing text to numeric in E3692 / R3692C5: '2'
## Warning: Coercing text to numeric in E3693 / R3693C5: '2'
## Warning: Coercing text to numeric in E3694 / R3694C5: '2'
## Warning: Coercing text to numeric in E3695 / R3695C5: '2'
## Warning: Coercing text to numeric in E3696 / R3696C5: '2'
## Warning: Coercing text to numeric in E3697 / R3697C5: '2'
## Warning: Coercing text to numeric in E3698 / R3698C5: '1'
## Warning: Coercing text to numeric in E3699 / R3699C5: '1'
## Warning: Coercing text to numeric in E3700 / R3700C5: '1'
## Warning: Coercing text to numeric in E3701 / R3701C5: '1'
## Warning: Coercing text to numeric in E3702 / R3702C5: '1'
## Warning: Coercing text to numeric in E3703 / R3703C5: '1'
## Warning: Coercing text to numeric in E3704 / R3704C5: '1'
## Warning: Coercing text to numeric in E3705 / R3705C5: '1'
## Warning: Coercing text to numeric in E3706 / R3706C5: '1'
## Warning: Coercing text to numeric in E3707 / R3707C5: '1'
## Warning: Coercing text to numeric in E3708 / R3708C5: '1'
## Warning: Coercing text to numeric in E3709 / R3709C5: '1'
## Warning: Coercing text to numeric in E3710 / R3710C5: '1'
## Warning: Coercing text to numeric in E3711 / R3711C5: '1'
## Warning: Coercing text to numeric in E3712 / R3712C5: '1'
## Warning: Coercing text to numeric in E3713 / R3713C5: '1'
## Warning: Coercing text to numeric in E3714 / R3714C5: '1'
## Warning: Coercing text to numeric in E3715 / R3715C5: '1'
## Warning: Coercing text to numeric in E3716 / R3716C5: '2'
## Warning: Coercing text to numeric in E3717 / R3717C5: '2'
## Warning: Coercing text to numeric in E3718 / R3718C5: '2'
## Warning: Coercing text to numeric in E3719 / R3719C5: '2'
## Warning: Coercing text to numeric in E3720 / R3720C5: '2'
## Warning: Coercing text to numeric in E3721 / R3721C5: '2'
## Warning: Coercing text to numeric in E3722 / R3722C5: '2'
## Warning: Coercing text to numeric in E3723 / R3723C5: '2'
## Warning: Coercing text to numeric in E3724 / R3724C5: '2'
## Warning: Coercing text to numeric in E3725 / R3725C5: '2'
## Warning: Coercing text to numeric in E3726 / R3726C5: '2'
## Warning: Coercing text to numeric in E3727 / R3727C5: '2'
## Warning: Coercing text to numeric in E3728 / R3728C5: '2'
## Warning: Coercing text to numeric in E3729 / R3729C5: '2'
## Warning: Coercing text to numeric in E3730 / R3730C5: '2'
## Warning: Coercing text to numeric in E3731 / R3731C5: '2'
## Warning: Coercing text to numeric in E3732 / R3732C5: '2'
## Warning: Coercing text to numeric in E3733 / R3733C5: '2'
## Warning: Coercing text to numeric in E3734 / R3734C5: '2'
## Warning: Coercing text to numeric in E3735 / R3735C5: '2'
## Warning: Coercing text to numeric in E3736 / R3736C5: '2'
## Warning: Coercing text to numeric in E3737 / R3737C5: '2'
## Warning: Coercing text to numeric in E3738 / R3738C5: '2'
## Warning: Coercing text to numeric in E3739 / R3739C5: '2'
## Warning: Coercing text to numeric in E3740 / R3740C5: '2'
## Warning: Coercing text to numeric in E3741 / R3741C5: '2'
## Warning: Coercing text to numeric in E3742 / R3742C5: '2'
## Warning: Coercing text to numeric in E3743 / R3743C5: '2'
## Warning: Coercing text to numeric in E3744 / R3744C5: '2'
## Warning: Coercing text to numeric in E3745 / R3745C5: '2'
## Warning: Coercing text to numeric in E3746 / R3746C5: '1'
## Warning: Coercing text to numeric in E3747 / R3747C5: '1'
## Warning: Coercing text to numeric in E3748 / R3748C5: '1'
## Warning: Coercing text to numeric in E3749 / R3749C5: '1'
## Warning: Coercing text to numeric in E3750 / R3750C5: '1'
## Warning: Coercing text to numeric in E3751 / R3751C5: '1'
## Warning: Coercing text to numeric in E3752 / R3752C5: '2'
## Warning: Coercing text to numeric in E3753 / R3753C5: '2'
## Warning: Coercing text to numeric in E3754 / R3754C5: '2'
## Warning: Coercing text to numeric in E3755 / R3755C5: '2'
## Warning: Coercing text to numeric in E3756 / R3756C5: '2'
## Warning: Coercing text to numeric in E3757 / R3757C5: '2'
## Warning: Coercing text to numeric in E3758 / R3758C5: '2'
## Warning: Coercing text to numeric in E3759 / R3759C5: '2'
## Warning: Coercing text to numeric in E3760 / R3760C5: '2'
## Warning: Coercing text to numeric in E3761 / R3761C5: '2'
## Warning: Coercing text to numeric in E3762 / R3762C5: '2'
## Warning: Coercing text to numeric in E3763 / R3763C5: '2'
## Warning: Coercing text to numeric in E3764 / R3764C5: '1'
## Warning: Coercing text to numeric in E3765 / R3765C5: '1'
## Warning: Coercing text to numeric in E3766 / R3766C5: '1'
## Warning: Coercing text to numeric in E3767 / R3767C5: '1'
## Warning: Coercing text to numeric in E3768 / R3768C5: '1'
## Warning: Coercing text to numeric in E3769 / R3769C5: '1'
## Warning: Coercing text to numeric in E3770 / R3770C5: '1'
## Warning: Coercing text to numeric in E3771 / R3771C5: '1'
## Warning: Coercing text to numeric in E3772 / R3772C5: '1'
## Warning: Coercing text to numeric in E3773 / R3773C5: '1'
## Warning: Coercing text to numeric in E3774 / R3774C5: '1'
## Warning: Coercing text to numeric in E3775 / R3775C5: '1'
## Warning: Coercing text to numeric in E3776 / R3776C5: '1'
## Warning: Coercing text to numeric in E3777 / R3777C5: '1'
## Warning: Coercing text to numeric in E3778 / R3778C5: '1'
## Warning: Coercing text to numeric in E3779 / R3779C5: '1'
## Warning: Coercing text to numeric in E3780 / R3780C5: '1'
## Warning: Coercing text to numeric in E3781 / R3781C5: '1'
## Warning: Coercing text to numeric in E3782 / R3782C5: '1'
## Warning: Coercing text to numeric in E3783 / R3783C5: '1'
## Warning: Coercing text to numeric in E3784 / R3784C5: '1'
## Warning: Coercing text to numeric in E3785 / R3785C5: '1'
## Warning: Coercing text to numeric in E3786 / R3786C5: '1'
## Warning: Coercing text to numeric in E3787 / R3787C5: '1'
## Warning: Coercing text to numeric in E3788 / R3788C5: '2'
## Warning: Coercing text to numeric in E3789 / R3789C5: '2'
## Warning: Coercing text to numeric in E3790 / R3790C5: '2'
## Warning: Coercing text to numeric in E3791 / R3791C5: '2'
## Warning: Coercing text to numeric in E3792 / R3792C5: '2'
## Warning: Coercing text to numeric in E3793 / R3793C5: '2'
## Warning: Coercing text to numeric in E3794 / R3794C5: '2'
## Warning: Coercing text to numeric in E3795 / R3795C5: '2'
## Warning: Coercing text to numeric in E3796 / R3796C5: '2'
## Warning: Coercing text to numeric in E3797 / R3797C5: '2'
## Warning: Coercing text to numeric in E3798 / R3798C5: '2'
## Warning: Coercing text to numeric in E3799 / R3799C5: '2'
## Warning: Coercing text to numeric in E3800 / R3800C5: '1'
## Warning: Coercing text to numeric in E3801 / R3801C5: '1'
## Warning: Coercing text to numeric in E3802 / R3802C5: '1'
## Warning: Coercing text to numeric in E3803 / R3803C5: '1'
## Warning: Coercing text to numeric in E3804 / R3804C5: '1'
## Warning: Coercing text to numeric in E3805 / R3805C5: '1'
## Warning: Coercing text to numeric in E3806 / R3806C5: '1'
## Warning: Coercing text to numeric in E3807 / R3807C5: '1'
## Warning: Coercing text to numeric in E3808 / R3808C5: '1'
## Warning: Coercing text to numeric in E3809 / R3809C5: '1'
## Warning: Coercing text to numeric in E3810 / R3810C5: '1'
## Warning: Coercing text to numeric in E3811 / R3811C5: '1'
## Warning: Coercing text to numeric in E3812 / R3812C5: '1'
## Warning: Coercing text to numeric in E3813 / R3813C5: '1'
## Warning: Coercing text to numeric in E3814 / R3814C5: '1'
## Warning: Coercing text to numeric in E3815 / R3815C5: '1'
## Warning: Coercing text to numeric in E3816 / R3816C5: '1'
## Warning: Coercing text to numeric in E3817 / R3817C5: '1'
## Warning: Coercing text to numeric in E3818 / R3818C5: '2'
## Warning: Coercing text to numeric in E3819 / R3819C5: '2'
## Warning: Coercing text to numeric in E3820 / R3820C5: '2'
## Warning: Coercing text to numeric in E3821 / R3821C5: '2'
## Warning: Coercing text to numeric in E3822 / R3822C5: '2'
## Warning: Coercing text to numeric in E3823 / R3823C5: '2'
## Warning: Coercing text to numeric in E3824 / R3824C5: '2'
## Warning: Coercing text to numeric in E3825 / R3825C5: '2'
## Warning: Coercing text to numeric in E3826 / R3826C5: '2'
## Warning: Coercing text to numeric in E3827 / R3827C5: '2'
## Warning: Coercing text to numeric in E3828 / R3828C5: '2'
## Warning: Coercing text to numeric in E3829 / R3829C5: '2'
## Warning: Coercing text to numeric in E3830 / R3830C5: '1'
## Warning: Coercing text to numeric in E3831 / R3831C5: '1'
## Warning: Coercing text to numeric in E3832 / R3832C5: '1'
## Warning: Coercing text to numeric in E3833 / R3833C5: '1'
## Warning: Coercing text to numeric in E3834 / R3834C5: '1'
## Warning: Coercing text to numeric in E3835 / R3835C5: '1'
## Warning: Coercing text to numeric in E3836 / R3836C5: '1'
## Warning: Coercing text to numeric in E3837 / R3837C5: '1'
## Warning: Coercing text to numeric in E3838 / R3838C5: '1'
## Warning: Coercing text to numeric in E3839 / R3839C5: '1'
## Warning: Coercing text to numeric in E3840 / R3840C5: '1'
## Warning: Coercing text to numeric in E3841 / R3841C5: '1'
## Warning: Coercing text to numeric in E3842 / R3842C5: '1'
## Warning: Coercing text to numeric in E3843 / R3843C5: '1'
## Warning: Coercing text to numeric in E3844 / R3844C5: '1'
## Warning: Coercing text to numeric in E3845 / R3845C5: '1'
## Warning: Coercing text to numeric in E3846 / R3846C5: '1'
## Warning: Coercing text to numeric in E3847 / R3847C5: '1'
## Warning: Coercing text to numeric in E3848 / R3848C5: '2'
## Warning: Coercing text to numeric in E3849 / R3849C5: '2'
## Warning: Coercing text to numeric in E3850 / R3850C5: '2'
## Warning: Coercing text to numeric in E3851 / R3851C5: '2'
## Warning: Coercing text to numeric in E3852 / R3852C5: '2'
## Warning: Coercing text to numeric in E3853 / R3853C5: '2'
## Warning: Coercing text to numeric in E3854 / R3854C5: '2'
## Warning: Coercing text to numeric in E3855 / R3855C5: '2'
## Warning: Coercing text to numeric in E3856 / R3856C5: '2'
## Warning: Coercing text to numeric in E3857 / R3857C5: '2'
## Warning: Coercing text to numeric in E3858 / R3858C5: '2'
## Warning: Coercing text to numeric in E3859 / R3859C5: '2'
## Warning: Coercing text to numeric in E3860 / R3860C5: '1'
## Warning: Coercing text to numeric in E3861 / R3861C5: '1'
## Warning: Coercing text to numeric in E3862 / R3862C5: '1'
## Warning: Coercing text to numeric in E3863 / R3863C5: '1'
## Warning: Coercing text to numeric in E3864 / R3864C5: '1'
## Warning: Coercing text to numeric in E3865 / R3865C5: '1'
## Warning: Coercing text to numeric in E3866 / R3866C5: '2'
## Warning: Coercing text to numeric in E3867 / R3867C5: '2'
## Warning: Coercing text to numeric in E3868 / R3868C5: '2'
## Warning: Coercing text to numeric in E3869 / R3869C5: '2'
## Warning: Coercing text to numeric in E3870 / R3870C5: '2'
## Warning: Coercing text to numeric in E3871 / R3871C5: '2'
## Warning: Coercing text to numeric in E3872 / R3872C5: '2'
## Warning: Coercing text to numeric in E3873 / R3873C5: '2'
## Warning: Coercing text to numeric in E3874 / R3874C5: '2'
## Warning: Coercing text to numeric in E3875 / R3875C5: '2'
## Warning: Coercing text to numeric in E3876 / R3876C5: '2'
## Warning: Coercing text to numeric in E3877 / R3877C5: '2'
## Warning: Coercing text to numeric in E3878 / R3878C5: '2'
## Warning: Coercing text to numeric in E3879 / R3879C5: '2'
## Warning: Coercing text to numeric in E3880 / R3880C5: '2'
## Warning: Coercing text to numeric in E3881 / R3881C5: '2'
## Warning: Coercing text to numeric in E3882 / R3882C5: '2'
## Warning: Coercing text to numeric in E3883 / R3883C5: '2'
## Warning: Coercing text to numeric in E3884 / R3884C5: '2'
## Warning: Coercing text to numeric in E3885 / R3885C5: '2'
## Warning: Coercing text to numeric in E3886 / R3886C5: '2'
## Warning: Coercing text to numeric in E3887 / R3887C5: '2'
## Warning: Coercing text to numeric in E3888 / R3888C5: '2'
## Warning: Coercing text to numeric in E3889 / R3889C5: '2'
## Warning: Coercing text to numeric in E3890 / R3890C5: '2'
## Warning: Coercing text to numeric in E3891 / R3891C5: '2'
## Warning: Coercing text to numeric in E3892 / R3892C5: '2'
## Warning: Coercing text to numeric in E3893 / R3893C5: '2'
## Warning: Coercing text to numeric in E3894 / R3894C5: '2'
## Warning: Coercing text to numeric in E3895 / R3895C5: '2'
## Warning: Coercing text to numeric in E3896 / R3896C5: '1'
## Warning: Coercing text to numeric in E3897 / R3897C5: '1'
## Warning: Coercing text to numeric in E3898 / R3898C5: '1'
## Warning: Coercing text to numeric in E3899 / R3899C5: '1'
## Warning: Coercing text to numeric in E3900 / R3900C5: '1'
## Warning: Coercing text to numeric in E3901 / R3901C5: '1'
## Warning: Coercing text to numeric in E3902 / R3902C5: '1'
## Warning: Coercing text to numeric in E3903 / R3903C5: '1'
## Warning: Coercing text to numeric in E3904 / R3904C5: '1'
## Warning: Coercing text to numeric in E3905 / R3905C5: '1'
## Warning: Coercing text to numeric in E3906 / R3906C5: '1'
## Warning: Coercing text to numeric in E3907 / R3907C5: '1'
## Warning: Coercing text to numeric in E3908 / R3908C5: '1'
## Warning: Coercing text to numeric in E3909 / R3909C5: '1'
## Warning: Coercing text to numeric in E3910 / R3910C5: '1'
## Warning: Coercing text to numeric in E3911 / R3911C5: '1'
## Warning: Coercing text to numeric in E3912 / R3912C5: '1'
## Warning: Coercing text to numeric in E3913 / R3913C5: '1'
## Warning: Coercing text to numeric in E3914 / R3914C5: '2'
## Warning: Coercing text to numeric in E3915 / R3915C5: '2'
## Warning: Coercing text to numeric in E3916 / R3916C5: '2'
## Warning: Coercing text to numeric in E3917 / R3917C5: '2'
## Warning: Coercing text to numeric in E3918 / R3918C5: '2'
## Warning: Coercing text to numeric in E3919 / R3919C5: '2'
## Warning: Coercing text to numeric in E3920 / R3920C5: '2'
## Warning: Coercing text to numeric in E3921 / R3921C5: '2'
## Warning: Coercing text to numeric in E3922 / R3922C5: '2'
## Warning: Coercing text to numeric in E3923 / R3923C5: '2'
## Warning: Coercing text to numeric in E3924 / R3924C5: '2'
## Warning: Coercing text to numeric in E3925 / R3925C5: '2'
## Warning: Coercing text to numeric in E3926 / R3926C5: '1'
## Warning: Coercing text to numeric in E3927 / R3927C5: '1'
## Warning: Coercing text to numeric in E3928 / R3928C5: '1'
## Warning: Coercing text to numeric in E3929 / R3929C5: '1'
## Warning: Coercing text to numeric in E3930 / R3930C5: '1'
## Warning: Coercing text to numeric in E3931 / R3931C5: '1'
## Warning: Coercing text to numeric in E3932 / R3932C5: '2'
## Warning: Coercing text to numeric in E3933 / R3933C5: '2'
## Warning: Coercing text to numeric in E3934 / R3934C5: '2'
## Warning: Coercing text to numeric in E3935 / R3935C5: '2'
## Warning: Coercing text to numeric in E3936 / R3936C5: '2'
## Warning: Coercing text to numeric in E3937 / R3937C5: '2'
## Warning: Coercing text to numeric in E3938 / R3938C5: '1'
## Warning: Coercing text to numeric in E3939 / R3939C5: '1'
## Warning: Coercing text to numeric in E3940 / R3940C5: '1'
## Warning: Coercing text to numeric in E3941 / R3941C5: '1'
## Warning: Coercing text to numeric in E3942 / R3942C5: '1'
## Warning: Coercing text to numeric in E3943 / R3943C5: '1'
## Warning: Coercing text to numeric in E3944 / R3944C5: '2'
## Warning: Coercing text to numeric in E3945 / R3945C5: '2'
## Warning: Coercing text to numeric in E3946 / R3946C5: '2'
## Warning: Coercing text to numeric in E3947 / R3947C5: '2'
## Warning: Coercing text to numeric in E3948 / R3948C5: '2'
## Warning: Coercing text to numeric in E3949 / R3949C5: '2'
## Warning: Coercing text to numeric in E3950 / R3950C5: '1'
## Warning: Coercing text to numeric in E3951 / R3951C5: '1'
## Warning: Coercing text to numeric in E3952 / R3952C5: '1'
## Warning: Coercing text to numeric in E3953 / R3953C5: '1'
## Warning: Coercing text to numeric in E3954 / R3954C5: '1'
## Warning: Coercing text to numeric in E3955 / R3955C5: '1'
## Warning: Coercing text to numeric in E3956 / R3956C5: '2'
## Warning: Coercing text to numeric in E3957 / R3957C5: '2'
## Warning: Coercing text to numeric in E3958 / R3958C5: '2'
## Warning: Coercing text to numeric in E3959 / R3959C5: '2'
## Warning: Coercing text to numeric in E3960 / R3960C5: '2'
## Warning: Coercing text to numeric in E3961 / R3961C5: '2'
## Warning: Coercing text to numeric in E3962 / R3962C5: '1'
## Warning: Coercing text to numeric in E3963 / R3963C5: '1'
## Warning: Coercing text to numeric in E3964 / R3964C5: '1'
## Warning: Coercing text to numeric in E3965 / R3965C5: '1'
## Warning: Coercing text to numeric in E3966 / R3966C5: '1'
## Warning: Coercing text to numeric in E3967 / R3967C5: '1'
## Warning: Coercing text to numeric in E3968 / R3968C5: '2'
## Warning: Coercing text to numeric in E3969 / R3969C5: '2'
## Warning: Coercing text to numeric in E3970 / R3970C5: '2'
## Warning: Coercing text to numeric in E3971 / R3971C5: '2'
## Warning: Coercing text to numeric in E3972 / R3972C5: '2'
## Warning: Coercing text to numeric in E3973 / R3973C5: '2'
## Warning: Coercing text to numeric in E3974 / R3974C5: '1'
## Warning: Coercing text to numeric in E3975 / R3975C5: '1'
## Warning: Coercing text to numeric in E3976 / R3976C5: '1'
## Warning: Coercing text to numeric in E3977 / R3977C5: '1'
## Warning: Coercing text to numeric in E3978 / R3978C5: '1'
## Warning: Coercing text to numeric in E3979 / R3979C5: '1'
## Warning: Coercing text to numeric in E3980 / R3980C5: '1'
## Warning: Coercing text to numeric in E3981 / R3981C5: '1'
## Warning: Coercing text to numeric in E3982 / R3982C5: '1'
## Warning: Coercing text to numeric in E3983 / R3983C5: '1'
## Warning: Coercing text to numeric in E3984 / R3984C5: '1'
## Warning: Coercing text to numeric in E3985 / R3985C5: '1'
## Warning: Coercing text to numeric in E3986 / R3986C5: '1'
## Warning: Coercing text to numeric in E3987 / R3987C5: '1'
## Warning: Coercing text to numeric in E3988 / R3988C5: '1'
## Warning: Coercing text to numeric in E3989 / R3989C5: '1'
## Warning: Coercing text to numeric in E3990 / R3990C5: '1'
## Warning: Coercing text to numeric in E3991 / R3991C5: '1'
## Warning: Coercing text to numeric in E3992 / R3992C5: '2'
## Warning: Coercing text to numeric in E3993 / R3993C5: '2'
## Warning: Coercing text to numeric in E3994 / R3994C5: '2'
## Warning: Coercing text to numeric in E3995 / R3995C5: '2'
## Warning: Coercing text to numeric in E3996 / R3996C5: '2'
## Warning: Coercing text to numeric in E3997 / R3997C5: '2'
## Warning: Coercing text to numeric in E3998 / R3998C5: '2'
## Warning: Coercing text to numeric in E3999 / R3999C5: '2'
## Warning: Coercing text to numeric in E4000 / R4000C5: '2'
## Warning: Coercing text to numeric in E4001 / R4001C5: '2'
## Warning: Coercing text to numeric in E4002 / R4002C5: '2'
## Warning: Coercing text to numeric in E4003 / R4003C5: '2'
## Warning: Coercing text to numeric in E4004 / R4004C5: '2'
## Warning: Coercing text to numeric in E4005 / R4005C5: '2'
## Warning: Coercing text to numeric in E4006 / R4006C5: '2'
## Warning: Coercing text to numeric in E4007 / R4007C5: '2'
## Warning: Coercing text to numeric in E4008 / R4008C5: '2'
## Warning: Coercing text to numeric in E4009 / R4009C5: '2'
## Warning: Coercing text to numeric in E4010 / R4010C5: '1'
## Warning: Coercing text to numeric in E4011 / R4011C5: '1'
## Warning: Coercing text to numeric in E4012 / R4012C5: '1'
## Warning: Coercing text to numeric in E4013 / R4013C5: '1'
## Warning: Coercing text to numeric in E4014 / R4014C5: '1'
## Warning: Coercing text to numeric in E4015 / R4015C5: '1'
## Warning: Coercing text to numeric in E4016 / R4016C5: '1'
## Warning: Coercing text to numeric in E4017 / R4017C5: '1'
## Warning: Coercing text to numeric in E4018 / R4018C5: '1'
## Warning: Coercing text to numeric in E4019 / R4019C5: '1'
## Warning: Coercing text to numeric in E4020 / R4020C5: '1'
## Warning: Coercing text to numeric in E4021 / R4021C5: '1'
## Warning: Coercing text to numeric in E4022 / R4022C5: '1'
## Warning: Coercing text to numeric in E4023 / R4023C5: '1'
## Warning: Coercing text to numeric in E4024 / R4024C5: '1'
## Warning: Coercing text to numeric in E4025 / R4025C5: '1'
## Warning: Coercing text to numeric in E4026 / R4026C5: '1'
## Warning: Coercing text to numeric in E4027 / R4027C5: '1'
## Warning: Coercing text to numeric in E4028 / R4028C5: '2'
## Warning: Coercing text to numeric in E4029 / R4029C5: '2'
## Warning: Coercing text to numeric in E4030 / R4030C5: '2'
## Warning: Coercing text to numeric in E4031 / R4031C5: '2'
## Warning: Coercing text to numeric in E4032 / R4032C5: '2'
## Warning: Coercing text to numeric in E4033 / R4033C5: '2'
## Warning: Coercing text to numeric in E4034 / R4034C5: '1'
## Warning: Coercing text to numeric in E4035 / R4035C5: '1'
## Warning: Coercing text to numeric in E4036 / R4036C5: '1'
## Warning: Coercing text to numeric in E4037 / R4037C5: '1'
## Warning: Coercing text to numeric in E4038 / R4038C5: '1'
## Warning: Coercing text to numeric in E4039 / R4039C5: '1'
## Warning: Coercing text to numeric in E4040 / R4040C5: '1'
## Warning: Coercing text to numeric in E4041 / R4041C5: '1'
## Warning: Coercing text to numeric in E4042 / R4042C5: '1'
## Warning: Coercing text to numeric in E4043 / R4043C5: '1'
## Warning: Coercing text to numeric in E4044 / R4044C5: '1'
## Warning: Coercing text to numeric in E4045 / R4045C5: '1'
## Warning: Coercing text to numeric in E4046 / R4046C5: '2'
## Warning: Coercing text to numeric in E4047 / R4047C5: '2'
## Warning: Coercing text to numeric in E4048 / R4048C5: '2'
## Warning: Coercing text to numeric in E4049 / R4049C5: '2'
## Warning: Coercing text to numeric in E4050 / R4050C5: '2'
## Warning: Coercing text to numeric in E4051 / R4051C5: '2'
## Warning: Coercing text to numeric in E4052 / R4052C5: '1'
## Warning: Coercing text to numeric in E4053 / R4053C5: '1'
## Warning: Coercing text to numeric in E4054 / R4054C5: '1'
## Warning: Coercing text to numeric in E4055 / R4055C5: '1'
## Warning: Coercing text to numeric in E4056 / R4056C5: '1'
## Warning: Coercing text to numeric in E4057 / R4057C5: '1'
## Warning: Coercing text to numeric in E4058 / R4058C5: '2'
## Warning: Coercing text to numeric in E4059 / R4059C5: '2'
## Warning: Coercing text to numeric in E4060 / R4060C5: '2'
## Warning: Coercing text to numeric in E4061 / R4061C5: '2'
## Warning: Coercing text to numeric in E4062 / R4062C5: '2'
## Warning: Coercing text to numeric in E4063 / R4063C5: '2'
## Warning: Coercing text to numeric in E4064 / R4064C5: '2'
## Warning: Coercing text to numeric in E4065 / R4065C5: '2'
## Warning: Coercing text to numeric in E4066 / R4066C5: '2'
## Warning: Coercing text to numeric in E4067 / R4067C5: '2'
## Warning: Coercing text to numeric in E4068 / R4068C5: '2'
## Warning: Coercing text to numeric in E4069 / R4069C5: '2'
## Warning: Coercing text to numeric in E4070 / R4070C5: '1'
## Warning: Coercing text to numeric in E4071 / R4071C5: '1'
## Warning: Coercing text to numeric in E4072 / R4072C5: '1'
## Warning: Coercing text to numeric in E4073 / R4073C5: '1'
## Warning: Coercing text to numeric in E4074 / R4074C5: '1'
## Warning: Coercing text to numeric in E4075 / R4075C5: '1'
## Warning: Coercing text to numeric in E4076 / R4076C5: '2'
## Warning: Coercing text to numeric in E4077 / R4077C5: '2'
## Warning: Coercing text to numeric in E4078 / R4078C5: '2'
## Warning: Coercing text to numeric in E4079 / R4079C5: '2'
## Warning: Coercing text to numeric in E4080 / R4080C5: '2'
## Warning: Coercing text to numeric in E4081 / R4081C5: '2'
## Warning: Coercing text to numeric in E4082 / R4082C5: '2'
## Warning: Coercing text to numeric in E4083 / R4083C5: '2'
## Warning: Coercing text to numeric in E4084 / R4084C5: '2'
## Warning: Coercing text to numeric in E4085 / R4085C5: '2'
## Warning: Coercing text to numeric in E4086 / R4086C5: '2'
## Warning: Coercing text to numeric in E4087 / R4087C5: '2'
## Warning: Coercing text to numeric in E4088 / R4088C5: '2'
## Warning: Coercing text to numeric in E4089 / R4089C5: '2'
## Warning: Coercing text to numeric in E4090 / R4090C5: '2'
## Warning: Coercing text to numeric in E4091 / R4091C5: '2'
## Warning: Coercing text to numeric in E4092 / R4092C5: '2'
## Warning: Coercing text to numeric in E4093 / R4093C5: '2'
## Warning: Coercing text to numeric in E4094 / R4094C5: '1'
## Warning: Coercing text to numeric in E4095 / R4095C5: '1'
## Warning: Coercing text to numeric in E4096 / R4096C5: '1'
## Warning: Coercing text to numeric in E4097 / R4097C5: '1'
## Warning: Coercing text to numeric in E4098 / R4098C5: '1'
## Warning: Coercing text to numeric in E4099 / R4099C5: '1'
## Warning: Coercing text to numeric in E4100 / R4100C5: '1'
## Warning: Coercing text to numeric in E4101 / R4101C5: '1'
## Warning: Coercing text to numeric in E4102 / R4102C5: '1'
## Warning: Coercing text to numeric in E4103 / R4103C5: '1'
## Warning: Coercing text to numeric in E4104 / R4104C5: '1'
## Warning: Coercing text to numeric in E4105 / R4105C5: '1'
## Warning: Coercing text to numeric in E4106 / R4106C5: '2'
## Warning: Coercing text to numeric in E4107 / R4107C5: '2'
## Warning: Coercing text to numeric in E4108 / R4108C5: '2'
## Warning: Coercing text to numeric in E4109 / R4109C5: '2'
## Warning: Coercing text to numeric in E4110 / R4110C5: '2'
## Warning: Coercing text to numeric in E4111 / R4111C5: '2'
## Warning: Coercing text to numeric in E4112 / R4112C5: '1'
## Warning: Coercing text to numeric in E4113 / R4113C5: '1'
## Warning: Coercing text to numeric in E4114 / R4114C5: '1'
## Warning: Coercing text to numeric in E4115 / R4115C5: '1'
## Warning: Coercing text to numeric in E4116 / R4116C5: '1'
## Warning: Coercing text to numeric in E4117 / R4117C5: '1'
## Warning: Coercing text to numeric in E4118 / R4118C5: '2'
## Warning: Coercing text to numeric in E4119 / R4119C5: '2'
## Warning: Coercing text to numeric in E4120 / R4120C5: '2'
## Warning: Coercing text to numeric in E4121 / R4121C5: '2'
## Warning: Coercing text to numeric in E4122 / R4122C5: '2'
## Warning: Coercing text to numeric in E4123 / R4123C5: '2'
## Warning: Coercing text to numeric in E4124 / R4124C5: '2'
## Warning: Coercing text to numeric in E4125 / R4125C5: '2'
## Warning: Coercing text to numeric in E4126 / R4126C5: '2'
## Warning: Coercing text to numeric in E4127 / R4127C5: '2'
## Warning: Coercing text to numeric in E4128 / R4128C5: '2'
## Warning: Coercing text to numeric in E4129 / R4129C5: '2'
## Warning: Coercing text to numeric in E4130 / R4130C5: '2'
## Warning: Coercing text to numeric in E4131 / R4131C5: '2'
## Warning: Coercing text to numeric in E4132 / R4132C5: '2'
## Warning: Coercing text to numeric in E4133 / R4133C5: '2'
## Warning: Coercing text to numeric in E4134 / R4134C5: '2'
## Warning: Coercing text to numeric in E4135 / R4135C5: '2'
## Warning: Coercing text to numeric in E4136 / R4136C5: '2'
## Warning: Coercing text to numeric in E4137 / R4137C5: '2'
## Warning: Coercing text to numeric in E4138 / R4138C5: '2'
## Warning: Coercing text to numeric in E4139 / R4139C5: '2'
## Warning: Coercing text to numeric in E4140 / R4140C5: '2'
## Warning: Coercing text to numeric in E4141 / R4141C5: '2'
## Warning: Coercing text to numeric in E4142 / R4142C5: '2'
## Warning: Coercing text to numeric in E4143 / R4143C5: '2'
## Warning: Coercing text to numeric in E4144 / R4144C5: '2'
## Warning: Coercing text to numeric in E4145 / R4145C5: '2'
## Warning: Coercing text to numeric in E4146 / R4146C5: '2'
## Warning: Coercing text to numeric in E4147 / R4147C5: '2'
## Warning: Coercing text to numeric in E4148 / R4148C5: '2'
## Warning: Coercing text to numeric in E4149 / R4149C5: '2'
## Warning: Coercing text to numeric in E4150 / R4150C5: '2'
## Warning: Coercing text to numeric in E4151 / R4151C5: '2'
## Warning: Coercing text to numeric in E4152 / R4152C5: '2'
## Warning: Coercing text to numeric in E4153 / R4153C5: '2'
## Warning: Coercing text to numeric in E4154 / R4154C5: '2'
## Warning: Coercing text to numeric in E4155 / R4155C5: '2'
## Warning: Coercing text to numeric in E4156 / R4156C5: '2'
## Warning: Coercing text to numeric in E4157 / R4157C5: '2'
## Warning: Coercing text to numeric in E4158 / R4158C5: '2'
## Warning: Coercing text to numeric in E4159 / R4159C5: '2'
## Warning: Coercing text to numeric in E4160 / R4160C5: '1'
## Warning: Coercing text to numeric in E4161 / R4161C5: '1'
## Warning: Coercing text to numeric in E4162 / R4162C5: '1'
## Warning: Coercing text to numeric in E4163 / R4163C5: '1'
## Warning: Coercing text to numeric in E4164 / R4164C5: '1'
## Warning: Coercing text to numeric in E4165 / R4165C5: '1'
## Warning: Coercing text to numeric in E4166 / R4166C5: '2'
## Warning: Coercing text to numeric in E4167 / R4167C5: '2'
## Warning: Coercing text to numeric in E4168 / R4168C5: '2'
## Warning: Coercing text to numeric in E4169 / R4169C5: '2'
## Warning: Coercing text to numeric in E4170 / R4170C5: '2'
## Warning: Coercing text to numeric in E4171 / R4171C5: '2'
## Warning: Coercing text to numeric in E4172 / R4172C5: '1'
## Warning: Coercing text to numeric in E4173 / R4173C5: '1'
## Warning: Coercing text to numeric in E4174 / R4174C5: '1'
## Warning: Coercing text to numeric in E4175 / R4175C5: '1'
## Warning: Coercing text to numeric in E4176 / R4176C5: '1'
## Warning: Coercing text to numeric in E4177 / R4177C5: '1'
## Warning: Coercing text to numeric in E4178 / R4178C5: '2'
## Warning: Coercing text to numeric in E4179 / R4179C5: '2'
## Warning: Coercing text to numeric in E4180 / R4180C5: '2'
## Warning: Coercing text to numeric in E4181 / R4181C5: '2'
## Warning: Coercing text to numeric in E4182 / R4182C5: '2'
## Warning: Coercing text to numeric in E4183 / R4183C5: '2'
## Warning: Coercing text to numeric in E4184 / R4184C5: '1'
## Warning: Coercing text to numeric in E4185 / R4185C5: '1'
## Warning: Coercing text to numeric in E4186 / R4186C5: '1'
## Warning: Coercing text to numeric in E4187 / R4187C5: '1'
## Warning: Coercing text to numeric in E4188 / R4188C5: '1'
## Warning: Coercing text to numeric in E4189 / R4189C5: '1'
## Warning: Coercing text to numeric in E4190 / R4190C5: '1'
## Warning: Coercing text to numeric in E4191 / R4191C5: '1'
## Warning: Coercing text to numeric in E4192 / R4192C5: '1'
## Warning: Coercing text to numeric in E4193 / R4193C5: '1'
## Warning: Coercing text to numeric in E4194 / R4194C5: '1'
## Warning: Coercing text to numeric in E4195 / R4195C5: '1'
## Warning: Coercing text to numeric in E4196 / R4196C5: '1'
## Warning: Coercing text to numeric in E4197 / R4197C5: '1'
## Warning: Coercing text to numeric in E4198 / R4198C5: '1'
## Warning: Coercing text to numeric in E4199 / R4199C5: '1'
## Warning: Coercing text to numeric in E4200 / R4200C5: '1'
## Warning: Coercing text to numeric in E4201 / R4201C5: '1'
## Warning: Coercing text to numeric in E4202 / R4202C5: '1'
## Warning: Coercing text to numeric in E4203 / R4203C5: '1'
## Warning: Coercing text to numeric in E4204 / R4204C5: '1'
## Warning: Coercing text to numeric in E4205 / R4205C5: '1'
## Warning: Coercing text to numeric in E4206 / R4206C5: '1'
## Warning: Coercing text to numeric in E4207 / R4207C5: '1'
## Warning: Coercing text to numeric in E4208 / R4208C5: '1'
## Warning: Coercing text to numeric in E4209 / R4209C5: '1'
## Warning: Coercing text to numeric in E4210 / R4210C5: '1'
## Warning: Coercing text to numeric in E4211 / R4211C5: '1'
## Warning: Coercing text to numeric in E4212 / R4212C5: '1'
## Warning: Coercing text to numeric in E4213 / R4213C5: '1'
## Warning: Coercing text to numeric in E4214 / R4214C5: '2'
## Warning: Coercing text to numeric in E4215 / R4215C5: '2'
## Warning: Coercing text to numeric in E4216 / R4216C5: '2'
## Warning: Coercing text to numeric in E4217 / R4217C5: '2'
## Warning: Coercing text to numeric in E4218 / R4218C5: '2'
## Warning: Coercing text to numeric in E4219 / R4219C5: '2'
## Warning: Coercing text to numeric in E4220 / R4220C5: '1'
## Warning: Coercing text to numeric in E4221 / R4221C5: '1'
## Warning: Coercing text to numeric in E4222 / R4222C5: '1'
## Warning: Coercing text to numeric in E4223 / R4223C5: '1'
## Warning: Coercing text to numeric in E4224 / R4224C5: '1'
## Warning: Coercing text to numeric in E4225 / R4225C5: '1'
## Warning: Coercing text to numeric in E4226 / R4226C5: '1'
## Warning: Coercing text to numeric in E4227 / R4227C5: '1'
## Warning: Coercing text to numeric in E4228 / R4228C5: '1'
## Warning: Coercing text to numeric in E4229 / R4229C5: '1'
## Warning: Coercing text to numeric in E4230 / R4230C5: '1'
## Warning: Coercing text to numeric in E4231 / R4231C5: '1'
## Warning: Coercing text to numeric in E4232 / R4232C5: '1'
## Warning: Coercing text to numeric in E4233 / R4233C5: '1'
## Warning: Coercing text to numeric in E4234 / R4234C5: '1'
## Warning: Coercing text to numeric in E4235 / R4235C5: '1'
## Warning: Coercing text to numeric in E4236 / R4236C5: '1'
## Warning: Coercing text to numeric in E4237 / R4237C5: '1'
## Warning: Coercing text to numeric in E4238 / R4238C5: '2'
## Warning: Coercing text to numeric in E4239 / R4239C5: '2'
## Warning: Coercing text to numeric in E4240 / R4240C5: '2'
## Warning: Coercing text to numeric in E4241 / R4241C5: '2'
## Warning: Coercing text to numeric in E4242 / R4242C5: '2'
## Warning: Coercing text to numeric in E4243 / R4243C5: '2'
## Warning: Coercing text to numeric in E4244 / R4244C5: '2'
## Warning: Coercing text to numeric in E4245 / R4245C5: '2'
## Warning: Coercing text to numeric in E4246 / R4246C5: '2'
## Warning: Coercing text to numeric in E4247 / R4247C5: '2'
## Warning: Coercing text to numeric in E4248 / R4248C5: '2'
## Warning: Coercing text to numeric in E4249 / R4249C5: '2'
## Warning: Coercing text to numeric in E4250 / R4250C5: '2'
## Warning: Coercing text to numeric in E4251 / R4251C5: '2'
## Warning: Coercing text to numeric in E4252 / R4252C5: '2'
## Warning: Coercing text to numeric in E4253 / R4253C5: '2'
## Warning: Coercing text to numeric in E4254 / R4254C5: '2'
## Warning: Coercing text to numeric in E4255 / R4255C5: '2'
## Warning: Coercing text to numeric in E4256 / R4256C5: '2'
## Warning: Coercing text to numeric in E4257 / R4257C5: '2'
## Warning: Coercing text to numeric in E4258 / R4258C5: '2'
## Warning: Coercing text to numeric in E4259 / R4259C5: '2'
## Warning: Coercing text to numeric in E4260 / R4260C5: '2'
## Warning: Coercing text to numeric in E4261 / R4261C5: '2'
## Warning: Coercing text to numeric in E4262 / R4262C5: '2'
## Warning: Coercing text to numeric in E4263 / R4263C5: '2'
## Warning: Coercing text to numeric in E4264 / R4264C5: '2'
## Warning: Coercing text to numeric in E4265 / R4265C5: '2'
## Warning: Coercing text to numeric in E4266 / R4266C5: '2'
## Warning: Coercing text to numeric in E4267 / R4267C5: '2'
## Warning: Coercing text to numeric in E4268 / R4268C5: '2'
## Warning: Coercing text to numeric in E4269 / R4269C5: '2'
## Warning: Coercing text to numeric in E4270 / R4270C5: '2'
## Warning: Coercing text to numeric in E4271 / R4271C5: '2'
## Warning: Coercing text to numeric in E4272 / R4272C5: '2'
## Warning: Coercing text to numeric in E4273 / R4273C5: '2'
## Warning: Coercing text to numeric in E4274 / R4274C5: '2'
## Warning: Coercing text to numeric in E4275 / R4275C5: '2'
## Warning: Coercing text to numeric in E4276 / R4276C5: '2'
## Warning: Coercing text to numeric in E4277 / R4277C5: '2'
## Warning: Coercing text to numeric in E4278 / R4278C5: '2'
## Warning: Coercing text to numeric in E4279 / R4279C5: '2'
## Warning: Coercing text to numeric in E4280 / R4280C5: '2'
## Warning: Coercing text to numeric in E4281 / R4281C5: '2'
## Warning: Coercing text to numeric in E4282 / R4282C5: '2'
## Warning: Coercing text to numeric in E4283 / R4283C5: '2'
## Warning: Coercing text to numeric in E4284 / R4284C5: '2'
## Warning: Coercing text to numeric in E4285 / R4285C5: '2'
## Warning: Coercing text to numeric in E4286 / R4286C5: '2'
## Warning: Coercing text to numeric in E4287 / R4287C5: '2'
## Warning: Coercing text to numeric in E4288 / R4288C5: '2'
## Warning: Coercing text to numeric in E4289 / R4289C5: '2'
## Warning: Coercing text to numeric in E4290 / R4290C5: '2'
## Warning: Coercing text to numeric in E4291 / R4291C5: '2'
## Warning: Coercing text to numeric in E4292 / R4292C5: '1'
## Warning: Coercing text to numeric in E4293 / R4293C5: '1'
## Warning: Coercing text to numeric in E4294 / R4294C5: '1'
## Warning: Coercing text to numeric in E4295 / R4295C5: '1'
## Warning: Coercing text to numeric in E4296 / R4296C5: '1'
## Warning: Coercing text to numeric in E4297 / R4297C5: '1'
## Warning: Coercing text to numeric in E4298 / R4298C5: '1'
## Warning: Coercing text to numeric in E4299 / R4299C5: '1'
## Warning: Coercing text to numeric in E4300 / R4300C5: '1'
## Warning: Coercing text to numeric in E4301 / R4301C5: '1'
## Warning: Coercing text to numeric in E4302 / R4302C5: '1'
## Warning: Coercing text to numeric in E4303 / R4303C5: '1'
## Warning: Coercing text to numeric in E4304 / R4304C5: '1'
## Warning: Coercing text to numeric in E4305 / R4305C5: '1'
## Warning: Coercing text to numeric in E4306 / R4306C5: '1'
## Warning: Coercing text to numeric in E4307 / R4307C5: '1'
## Warning: Coercing text to numeric in E4308 / R4308C5: '1'
## Warning: Coercing text to numeric in E4309 / R4309C5: '1'
## Warning: Coercing text to numeric in E4310 / R4310C5: '2'
## Warning: Coercing text to numeric in E4311 / R4311C5: '2'
## Warning: Coercing text to numeric in E4312 / R4312C5: '2'
## Warning: Coercing text to numeric in E4313 / R4313C5: '2'
## Warning: Coercing text to numeric in E4314 / R4314C5: '2'
## Warning: Coercing text to numeric in E4315 / R4315C5: '2'
## Warning: Coercing text to numeric in E4316 / R4316C5: '1'
## Warning: Coercing text to numeric in E4317 / R4317C5: '1'
## Warning: Coercing text to numeric in E4318 / R4318C5: '1'
## Warning: Coercing text to numeric in E4319 / R4319C5: '1'
## Warning: Coercing text to numeric in E4320 / R4320C5: '1'
## Warning: Coercing text to numeric in E4321 / R4321C5: '1'
## Warning: Coercing text to numeric in E4322 / R4322C5: '1'
## Warning: Coercing text to numeric in E4323 / R4323C5: '1'
## Warning: Coercing text to numeric in E4324 / R4324C5: '1'
## Warning: Coercing text to numeric in E4325 / R4325C5: '1'
## Warning: Coercing text to numeric in E4326 / R4326C5: '1'
## Warning: Coercing text to numeric in E4327 / R4327C5: '1'
## Warning: Coercing text to numeric in E4328 / R4328C5: '1'
## Warning: Coercing text to numeric in E4329 / R4329C5: '1'
## Warning: Coercing text to numeric in E4330 / R4330C5: '1'
## Warning: Coercing text to numeric in E4331 / R4331C5: '1'
## Warning: Coercing text to numeric in E4332 / R4332C5: '1'
## Warning: Coercing text to numeric in E4333 / R4333C5: '1'
## Warning: Coercing text to numeric in E4334 / R4334C5: '2'
## Warning: Coercing text to numeric in E4335 / R4335C5: '2'
## Warning: Coercing text to numeric in E4336 / R4336C5: '2'
## Warning: Coercing text to numeric in E4337 / R4337C5: '2'
## Warning: Coercing text to numeric in E4338 / R4338C5: '2'
## Warning: Coercing text to numeric in E4339 / R4339C5: '2'
## Warning: Coercing text to numeric in E4340 / R4340C5: '1'
## Warning: Coercing text to numeric in E4341 / R4341C5: '1'
## Warning: Coercing text to numeric in E4342 / R4342C5: '1'
## Warning: Coercing text to numeric in E4343 / R4343C5: '1'
## Warning: Coercing text to numeric in E4344 / R4344C5: '1'
## Warning: Coercing text to numeric in E4345 / R4345C5: '1'
## Warning: Coercing text to numeric in E4346 / R4346C5: '1'
## Warning: Coercing text to numeric in E4347 / R4347C5: '1'
## Warning: Coercing text to numeric in E4348 / R4348C5: '1'
## Warning: Coercing text to numeric in E4349 / R4349C5: '1'
## Warning: Coercing text to numeric in E4350 / R4350C5: '1'
## Warning: Coercing text to numeric in E4351 / R4351C5: '1'
## Warning: Coercing text to numeric in E4352 / R4352C5: '2'
## Warning: Coercing text to numeric in E4353 / R4353C5: '2'
## Warning: Coercing text to numeric in E4354 / R4354C5: '2'
## Warning: Coercing text to numeric in E4355 / R4355C5: '2'
## Warning: Coercing text to numeric in E4356 / R4356C5: '2'
## Warning: Coercing text to numeric in E4357 / R4357C5: '2'
## Warning: Coercing text to numeric in E4358 / R4358C5: '2'
## Warning: Coercing text to numeric in E4359 / R4359C5: '2'
## Warning: Coercing text to numeric in E4360 / R4360C5: '2'
## Warning: Coercing text to numeric in E4361 / R4361C5: '2'
## Warning: Coercing text to numeric in E4362 / R4362C5: '2'
## Warning: Coercing text to numeric in E4363 / R4363C5: '2'
## Warning: Coercing text to numeric in E4364 / R4364C5: '2'
## Warning: Coercing text to numeric in E4365 / R4365C5: '2'
## Warning: Coercing text to numeric in E4366 / R4366C5: '2'
## Warning: Coercing text to numeric in E4367 / R4367C5: '2'
## Warning: Coercing text to numeric in E4368 / R4368C5: '2'
## Warning: Coercing text to numeric in E4369 / R4369C5: '2'
## Warning: Coercing text to numeric in E4370 / R4370C5: '2'
## Warning: Coercing text to numeric in E4371 / R4371C5: '2'
## Warning: Coercing text to numeric in E4372 / R4372C5: '2'
## Warning: Coercing text to numeric in E4373 / R4373C5: '2'
## Warning: Coercing text to numeric in E4374 / R4374C5: '2'
## Warning: Coercing text to numeric in E4375 / R4375C5: '2'
## Warning: Coercing text to numeric in E4376 / R4376C5: '2'
## Warning: Coercing text to numeric in E4377 / R4377C5: '2'
## Warning: Coercing text to numeric in E4378 / R4378C5: '2'
## Warning: Coercing text to numeric in E4379 / R4379C5: '2'
## Warning: Coercing text to numeric in E4380 / R4380C5: '2'
## Warning: Coercing text to numeric in E4381 / R4381C5: '2'
## Warning: Coercing text to numeric in E4382 / R4382C5: '2'
## Warning: Coercing text to numeric in E4383 / R4383C5: '2'
## Warning: Coercing text to numeric in E4384 / R4384C5: '2'
## Warning: Coercing text to numeric in E4385 / R4385C5: '2'
## Warning: Coercing text to numeric in E4386 / R4386C5: '2'
## Warning: Coercing text to numeric in E4387 / R4387C5: '2'
## Warning: Coercing text to numeric in E4388 / R4388C5: '2'
## Warning: Coercing text to numeric in E4389 / R4389C5: '2'
## Warning: Coercing text to numeric in E4390 / R4390C5: '2'
## Warning: Coercing text to numeric in E4391 / R4391C5: '2'
## Warning: Coercing text to numeric in E4392 / R4392C5: '2'
## Warning: Coercing text to numeric in E4393 / R4393C5: '2'
## Warning: Coercing text to numeric in E4394 / R4394C5: '1'
## Warning: Coercing text to numeric in E4395 / R4395C5: '1'
## Warning: Coercing text to numeric in E4396 / R4396C5: '1'
## Warning: Coercing text to numeric in E4397 / R4397C5: '1'
## Warning: Coercing text to numeric in E4398 / R4398C5: '1'
## Warning: Coercing text to numeric in E4399 / R4399C5: '1'
## Warning: Coercing text to numeric in E4400 / R4400C5: '2'
## Warning: Coercing text to numeric in E4401 / R4401C5: '2'
## Warning: Coercing text to numeric in E4402 / R4402C5: '2'
## Warning: Coercing text to numeric in E4403 / R4403C5: '2'
## Warning: Coercing text to numeric in E4404 / R4404C5: '2'
## Warning: Coercing text to numeric in E4405 / R4405C5: '2'
## Warning: Coercing text to numeric in E4406 / R4406C5: '2'
## Warning: Coercing text to numeric in E4407 / R4407C5: '2'
## Warning: Coercing text to numeric in E4408 / R4408C5: '2'
## Warning: Coercing text to numeric in E4409 / R4409C5: '2'
## Warning: Coercing text to numeric in E4410 / R4410C5: '2'
## Warning: Coercing text to numeric in E4411 / R4411C5: '2'
## Warning: Coercing text to numeric in E4412 / R4412C5: '2'
## Warning: Coercing text to numeric in E4413 / R4413C5: '2'
## Warning: Coercing text to numeric in E4414 / R4414C5: '2'
## Warning: Coercing text to numeric in E4415 / R4415C5: '2'
## Warning: Coercing text to numeric in E4416 / R4416C5: '2'
## Warning: Coercing text to numeric in E4417 / R4417C5: '2'
## Warning: Coercing text to numeric in E4418 / R4418C5: '2'
## Warning: Coercing text to numeric in E4419 / R4419C5: '2'
## Warning: Coercing text to numeric in E4420 / R4420C5: '2'
## Warning: Coercing text to numeric in E4421 / R4421C5: '2'
## Warning: Coercing text to numeric in E4422 / R4422C5: '2'
## Warning: Coercing text to numeric in E4423 / R4423C5: '2'
## Warning: Coercing text to numeric in E4424 / R4424C5: '2'
## Warning: Coercing text to numeric in E4425 / R4425C5: '2'
## Warning: Coercing text to numeric in E4426 / R4426C5: '2'
## Warning: Coercing text to numeric in E4427 / R4427C5: '2'
## Warning: Coercing text to numeric in E4428 / R4428C5: '2'
## Warning: Coercing text to numeric in E4429 / R4429C5: '2'
## Warning: Coercing text to numeric in E4430 / R4430C5: '2'
## Warning: Coercing text to numeric in E4431 / R4431C5: '2'
## Warning: Coercing text to numeric in E4432 / R4432C5: '2'
## Warning: Coercing text to numeric in E4433 / R4433C5: '2'
## Warning: Coercing text to numeric in E4434 / R4434C5: '2'
## Warning: Coercing text to numeric in E4435 / R4435C5: '2'
## Warning: Coercing text to numeric in E4436 / R4436C5: '2'
## Warning: Coercing text to numeric in E4437 / R4437C5: '2'
## Warning: Coercing text to numeric in E4438 / R4438C5: '2'
## Warning: Coercing text to numeric in E4439 / R4439C5: '2'
## Warning: Coercing text to numeric in E4440 / R4440C5: '2'
## Warning: Coercing text to numeric in E4441 / R4441C5: '2'
## Warning: Coercing text to numeric in E4442 / R4442C5: '2'
## Warning: Coercing text to numeric in E4443 / R4443C5: '2'
## Warning: Coercing text to numeric in E4444 / R4444C5: '2'
## Warning: Coercing text to numeric in E4445 / R4445C5: '2'
## Warning: Coercing text to numeric in E4446 / R4446C5: '2'
## Warning: Coercing text to numeric in E4447 / R4447C5: '2'
## Warning: Coercing text to numeric in E4448 / R4448C5: '2'
## Warning: Coercing text to numeric in E4449 / R4449C5: '2'
## Warning: Coercing text to numeric in E4450 / R4450C5: '2'
## Warning: Coercing text to numeric in E4451 / R4451C5: '2'
## Warning: Coercing text to numeric in E4452 / R4452C5: '2'
## Warning: Coercing text to numeric in E4453 / R4453C5: '2'
## Warning: Coercing text to numeric in E4454 / R4454C5: '1'
## Warning: Coercing text to numeric in E4455 / R4455C5: '1'
## Warning: Coercing text to numeric in E4456 / R4456C5: '1'
## Warning: Coercing text to numeric in E4457 / R4457C5: '1'
## Warning: Coercing text to numeric in E4458 / R4458C5: '1'
## Warning: Coercing text to numeric in E4459 / R4459C5: '1'
## Warning: Coercing text to numeric in E4460 / R4460C5: '2'
## Warning: Coercing text to numeric in E4461 / R4461C5: '2'
## Warning: Coercing text to numeric in E4462 / R4462C5: '2'
## Warning: Coercing text to numeric in E4463 / R4463C5: '2'
## Warning: Coercing text to numeric in E4464 / R4464C5: '2'
## Warning: Coercing text to numeric in E4465 / R4465C5: '2'
## Warning: Coercing text to numeric in E4466 / R4466C5: '2'
## Warning: Coercing text to numeric in E4467 / R4467C5: '2'
## Warning: Coercing text to numeric in E4468 / R4468C5: '2'
## Warning: Coercing text to numeric in E4469 / R4469C5: '2'
## Warning: Coercing text to numeric in E4470 / R4470C5: '2'
## Warning: Coercing text to numeric in E4471 / R4471C5: '2'
## Warning: Coercing text to numeric in E4472 / R4472C5: '1'
## Warning: Coercing text to numeric in E4473 / R4473C5: '1'
## Warning: Coercing text to numeric in E4474 / R4474C5: '1'
## Warning: Coercing text to numeric in E4475 / R4475C5: '1'
## Warning: Coercing text to numeric in E4476 / R4476C5: '1'
## Warning: Coercing text to numeric in E4477 / R4477C5: '1'
## Warning: Coercing text to numeric in E4478 / R4478C5: '1'
## Warning: Coercing text to numeric in E4479 / R4479C5: '1'
## Warning: Coercing text to numeric in E4480 / R4480C5: '1'
## Warning: Coercing text to numeric in E4481 / R4481C5: '1'
## Warning: Coercing text to numeric in E4482 / R4482C5: '1'
## Warning: Coercing text to numeric in E4483 / R4483C5: '1'
## Warning: Coercing text to numeric in E4484 / R4484C5: '2'
## Warning: Coercing text to numeric in E4485 / R4485C5: '2'
## Warning: Coercing text to numeric in E4486 / R4486C5: '2'
## Warning: Coercing text to numeric in E4487 / R4487C5: '2'
## Warning: Coercing text to numeric in E4488 / R4488C5: '2'
## Warning: Coercing text to numeric in E4489 / R4489C5: '2'
## Warning: Coercing text to numeric in E4490 / R4490C5: '2'
## Warning: Coercing text to numeric in E4491 / R4491C5: '2'
## Warning: Coercing text to numeric in E4492 / R4492C5: '2'
## Warning: Coercing text to numeric in E4493 / R4493C5: '2'
## Warning: Coercing text to numeric in E4494 / R4494C5: '2'
## Warning: Coercing text to numeric in E4495 / R4495C5: '2'
## Warning: Coercing text to numeric in E4496 / R4496C5: '1'
## Warning: Coercing text to numeric in E4497 / R4497C5: '1'
## Warning: Coercing text to numeric in E4498 / R4498C5: '1'
## Warning: Coercing text to numeric in E4499 / R4499C5: '1'
## Warning: Coercing text to numeric in E4500 / R4500C5: '1'
## Warning: Coercing text to numeric in E4501 / R4501C5: '1'
## Warning: Coercing text to numeric in E4502 / R4502C5: '2'
## Warning: Coercing text to numeric in E4503 / R4503C5: '2'
## Warning: Coercing text to numeric in E4504 / R4504C5: '2'
## Warning: Coercing text to numeric in E4505 / R4505C5: '2'
## Warning: Coercing text to numeric in E4506 / R4506C5: '2'
## Warning: Coercing text to numeric in E4507 / R4507C5: '2'
## Warning: Coercing text to numeric in E4508 / R4508C5: '1'
## Warning: Coercing text to numeric in E4509 / R4509C5: '1'
## Warning: Coercing text to numeric in E4510 / R4510C5: '1'
## Warning: Coercing text to numeric in E4511 / R4511C5: '1'
## Warning: Coercing text to numeric in E4512 / R4512C5: '1'
## Warning: Coercing text to numeric in E4513 / R4513C5: '1'
## Warning: Coercing text to numeric in E4514 / R4514C5: '1'
## Warning: Coercing text to numeric in E4515 / R4515C5: '1'
## Warning: Coercing text to numeric in E4516 / R4516C5: '1'
## Warning: Coercing text to numeric in E4517 / R4517C5: '1'
## Warning: Coercing text to numeric in E4518 / R4518C5: '1'
## Warning: Coercing text to numeric in E4519 / R4519C5: '1'
## Warning: Coercing text to numeric in E4520 / R4520C5: '2'
## Warning: Coercing text to numeric in E4521 / R4521C5: '2'
## Warning: Coercing text to numeric in E4522 / R4522C5: '2'
## Warning: Coercing text to numeric in E4523 / R4523C5: '2'
## Warning: Coercing text to numeric in E4524 / R4524C5: '2'
## Warning: Coercing text to numeric in E4525 / R4525C5: '2'
## Warning: Coercing text to numeric in E4526 / R4526C5: '1'
## Warning: Coercing text to numeric in E4527 / R4527C5: '1'
## Warning: Coercing text to numeric in E4528 / R4528C5: '1'
## Warning: Coercing text to numeric in E4529 / R4529C5: '1'
## Warning: Coercing text to numeric in E4530 / R4530C5: '1'
## Warning: Coercing text to numeric in E4531 / R4531C5: '1'
## Warning: Coercing text to numeric in E4532 / R4532C5: '1'
## Warning: Coercing text to numeric in E4533 / R4533C5: '1'
## Warning: Coercing text to numeric in E4534 / R4534C5: '1'
## Warning: Coercing text to numeric in E4535 / R4535C5: '1'
## Warning: Coercing text to numeric in E4536 / R4536C5: '1'
## Warning: Coercing text to numeric in E4537 / R4537C5: '1'
## Warning: Coercing text to numeric in E4538 / R4538C5: '2'
## Warning: Coercing text to numeric in E4539 / R4539C5: '2'
## Warning: Coercing text to numeric in E4540 / R4540C5: '2'
## Warning: Coercing text to numeric in E4541 / R4541C5: '2'
## Warning: Coercing text to numeric in E4542 / R4542C5: '2'
## Warning: Coercing text to numeric in E4543 / R4543C5: '2'
## Warning: Coercing text to numeric in E4544 / R4544C5: '2'
## Warning: Coercing text to numeric in E4545 / R4545C5: '2'
## Warning: Coercing text to numeric in E4546 / R4546C5: '2'
## Warning: Coercing text to numeric in E4547 / R4547C5: '2'
## Warning: Coercing text to numeric in E4548 / R4548C5: '2'
## Warning: Coercing text to numeric in E4549 / R4549C5: '2'
## Warning: Coercing text to numeric in E4550 / R4550C5: '2'
## Warning: Coercing text to numeric in E4551 / R4551C5: '2'
## Warning: Coercing text to numeric in E4552 / R4552C5: '2'
## Warning: Coercing text to numeric in E4553 / R4553C5: '2'
## Warning: Coercing text to numeric in E4554 / R4554C5: '2'
## Warning: Coercing text to numeric in E4555 / R4555C5: '2'
## Warning: Coercing text to numeric in E4556 / R4556C5: '2'
## Warning: Coercing text to numeric in E4557 / R4557C5: '2'
## Warning: Coercing text to numeric in E4558 / R4558C5: '2'
## Warning: Coercing text to numeric in E4559 / R4559C5: '2'
## Warning: Coercing text to numeric in E4560 / R4560C5: '2'
## Warning: Coercing text to numeric in E4561 / R4561C5: '2'
## Warning: Coercing text to numeric in E4562 / R4562C5: '1'
## Warning: Coercing text to numeric in E4563 / R4563C5: '1'
## Warning: Coercing text to numeric in E4564 / R4564C5: '1'
## Warning: Coercing text to numeric in E4565 / R4565C5: '1'
## Warning: Coercing text to numeric in E4566 / R4566C5: '1'
## Warning: Coercing text to numeric in E4567 / R4567C5: '1'
## Warning: Coercing text to numeric in E4568 / R4568C5: '1'
## Warning: Coercing text to numeric in E4569 / R4569C5: '1'
## Warning: Coercing text to numeric in E4570 / R4570C5: '1'
## Warning: Coercing text to numeric in E4571 / R4571C5: '1'
## Warning: Coercing text to numeric in E4572 / R4572C5: '1'
## Warning: Coercing text to numeric in E4573 / R4573C5: '1'
## Warning: Coercing text to numeric in E4574 / R4574C5: '1'
## Warning: Coercing text to numeric in E4575 / R4575C5: '1'
## Warning: Coercing text to numeric in E4576 / R4576C5: '1'
## Warning: Coercing text to numeric in E4577 / R4577C5: '1'
## Warning: Coercing text to numeric in E4578 / R4578C5: '1'
## Warning: Coercing text to numeric in E4579 / R4579C5: '1'
## Warning: Coercing text to numeric in E4580 / R4580C5: '2'
## Warning: Coercing text to numeric in E4581 / R4581C5: '2'
## Warning: Coercing text to numeric in E4582 / R4582C5: '2'
## Warning: Coercing text to numeric in E4583 / R4583C5: '2'
## Warning: Coercing text to numeric in E4584 / R4584C5: '2'
## Warning: Coercing text to numeric in E4585 / R4585C5: '2'
## Warning: Coercing text to numeric in E4586 / R4586C5: '2'
## Warning: Coercing text to numeric in E4587 / R4587C5: '2'
## Warning: Coercing text to numeric in E4588 / R4588C5: '2'
## Warning: Coercing text to numeric in E4589 / R4589C5: '2'
## Warning: Coercing text to numeric in E4590 / R4590C5: '2'
## Warning: Coercing text to numeric in E4591 / R4591C5: '2'
## Warning: Coercing text to numeric in E4592 / R4592C5: '2'
## Warning: Coercing text to numeric in E4593 / R4593C5: '2'
## Warning: Coercing text to numeric in E4594 / R4594C5: '2'
## Warning: Coercing text to numeric in E4595 / R4595C5: '2'
## Warning: Coercing text to numeric in E4596 / R4596C5: '2'
## Warning: Coercing text to numeric in E4597 / R4597C5: '2'
## Warning: Coercing text to numeric in E4598 / R4598C5: '1'
## Warning: Coercing text to numeric in E4599 / R4599C5: '1'
## Warning: Coercing text to numeric in E4600 / R4600C5: '1'
## Warning: Coercing text to numeric in E4601 / R4601C5: '1'
## Warning: Coercing text to numeric in E4602 / R4602C5: '1'
## Warning: Coercing text to numeric in E4603 / R4603C5: '1'
## Warning: Coercing text to numeric in E4604 / R4604C5: '1'
## Warning: Coercing text to numeric in E4605 / R4605C5: '1'
## Warning: Coercing text to numeric in E4606 / R4606C5: '1'
## Warning: Coercing text to numeric in E4607 / R4607C5: '1'
## Warning: Coercing text to numeric in E4608 / R4608C5: '1'
## Warning: Coercing text to numeric in E4609 / R4609C5: '1'
## Warning: Coercing text to numeric in E4610 / R4610C5: '2'
## Warning: Coercing text to numeric in E4611 / R4611C5: '2'
## Warning: Coercing text to numeric in E4612 / R4612C5: '2'
## Warning: Coercing text to numeric in E4613 / R4613C5: '2'
## Warning: Coercing text to numeric in E4614 / R4614C5: '2'
## Warning: Coercing text to numeric in E4615 / R4615C5: '2'
## Warning: Coercing text to numeric in E4616 / R4616C5: '1'
## Warning: Coercing text to numeric in E4617 / R4617C5: '1'
## Warning: Coercing text to numeric in E4618 / R4618C5: '1'
## Warning: Coercing text to numeric in E4619 / R4619C5: '1'
## Warning: Coercing text to numeric in E4620 / R4620C5: '1'
## Warning: Coercing text to numeric in E4621 / R4621C5: '1'
## Warning: Coercing text to numeric in E4622 / R4622C5: '2'
## Warning: Coercing text to numeric in E4623 / R4623C5: '2'
## Warning: Coercing text to numeric in E4624 / R4624C5: '2'
## Warning: Coercing text to numeric in E4625 / R4625C5: '2'
## Warning: Coercing text to numeric in E4626 / R4626C5: '2'
## Warning: Coercing text to numeric in E4627 / R4627C5: '2'
## Warning: Coercing text to numeric in E4628 / R4628C5: '2'
## Warning: Coercing text to numeric in E4629 / R4629C5: '2'
## Warning: Coercing text to numeric in E4630 / R4630C5: '2'
## Warning: Coercing text to numeric in E4631 / R4631C5: '2'
## Warning: Coercing text to numeric in E4632 / R4632C5: '2'
## Warning: Coercing text to numeric in E4633 / R4633C5: '2'
## Warning: Coercing text to numeric in E4634 / R4634C5: '1'
## Warning: Coercing text to numeric in E4635 / R4635C5: '1'
## Warning: Coercing text to numeric in E4636 / R4636C5: '1'
## Warning: Coercing text to numeric in E4637 / R4637C5: '1'
## Warning: Coercing text to numeric in E4638 / R4638C5: '1'
## Warning: Coercing text to numeric in E4639 / R4639C5: '1'
## Warning: Coercing text to numeric in E4640 / R4640C5: '1'
## Warning: Coercing text to numeric in E4641 / R4641C5: '1'
## Warning: Coercing text to numeric in E4642 / R4642C5: '1'
## Warning: Coercing text to numeric in E4643 / R4643C5: '1'
## Warning: Coercing text to numeric in E4644 / R4644C5: '1'
## Warning: Coercing text to numeric in E4645 / R4645C5: '1'
## Warning: Coercing text to numeric in E4646 / R4646C5: '2'
## Warning: Coercing text to numeric in E4647 / R4647C5: '2'
## Warning: Coercing text to numeric in E4648 / R4648C5: '2'
## Warning: Coercing text to numeric in E4649 / R4649C5: '2'
## Warning: Coercing text to numeric in E4650 / R4650C5: '2'
## Warning: Coercing text to numeric in E4651 / R4651C5: '2'
## Warning: Coercing text to numeric in E4652 / R4652C5: '2'
## Warning: Coercing text to numeric in E4653 / R4653C5: '2'
## Warning: Coercing text to numeric in E4654 / R4654C5: '2'
## Warning: Coercing text to numeric in E4655 / R4655C5: '2'
## Warning: Coercing text to numeric in E4656 / R4656C5: '2'
## Warning: Coercing text to numeric in E4657 / R4657C5: '2'
## Warning: Coercing text to numeric in E4658 / R4658C5: '1'
## Warning: Coercing text to numeric in E4659 / R4659C5: '1'
## Warning: Coercing text to numeric in E4660 / R4660C5: '1'
## Warning: Coercing text to numeric in E4661 / R4661C5: '1'
## Warning: Coercing text to numeric in E4662 / R4662C5: '1'
## Warning: Coercing text to numeric in E4663 / R4663C5: '1'
## Warning: Coercing text to numeric in E4664 / R4664C5: '2'
## Warning: Coercing text to numeric in E4665 / R4665C5: '2'
## Warning: Coercing text to numeric in E4666 / R4666C5: '2'
## Warning: Coercing text to numeric in E4667 / R4667C5: '2'
## Warning: Coercing text to numeric in E4668 / R4668C5: '2'
## Warning: Coercing text to numeric in E4669 / R4669C5: '2'
## Warning: Coercing text to numeric in E4670 / R4670C5: '2'
## Warning: Coercing text to numeric in E4671 / R4671C5: '2'
## Warning: Coercing text to numeric in E4672 / R4672C5: '2'
## Warning: Coercing text to numeric in E4673 / R4673C5: '2'
## Warning: Coercing text to numeric in E4674 / R4674C5: '2'
## Warning: Coercing text to numeric in E4675 / R4675C5: '2'
## Warning: Coercing text to numeric in E4676 / R4676C5: '2'
## Warning: Coercing text to numeric in E4677 / R4677C5: '2'
## Warning: Coercing text to numeric in E4678 / R4678C5: '2'
## Warning: Coercing text to numeric in E4679 / R4679C5: '2'
## Warning: Coercing text to numeric in E4680 / R4680C5: '2'
## Warning: Coercing text to numeric in E4681 / R4681C5: '2'
## Warning: Coercing text to numeric in E4682 / R4682C5: '2'
## Warning: Coercing text to numeric in E4683 / R4683C5: '2'
## Warning: Coercing text to numeric in E4684 / R4684C5: '2'
## Warning: Coercing text to numeric in E4685 / R4685C5: '2'
## Warning: Coercing text to numeric in E4686 / R4686C5: '2'
## Warning: Coercing text to numeric in E4687 / R4687C5: '2'
## Warning: Coercing text to numeric in E4688 / R4688C5: '1'
## Warning: Coercing text to numeric in E4689 / R4689C5: '1'
## Warning: Coercing text to numeric in E4690 / R4690C5: '1'
## Warning: Coercing text to numeric in E4691 / R4691C5: '1'
## Warning: Coercing text to numeric in E4692 / R4692C5: '1'
## Warning: Coercing text to numeric in E4693 / R4693C5: '1'
## Warning: Coercing text to numeric in E4694 / R4694C5: '1'
## Warning: Coercing text to numeric in E4695 / R4695C5: '1'
## Warning: Coercing text to numeric in E4696 / R4696C5: '1'
## Warning: Coercing text to numeric in E4697 / R4697C5: '1'
## Warning: Coercing text to numeric in E4698 / R4698C5: '1'
## Warning: Coercing text to numeric in E4699 / R4699C5: '1'
## Warning: Coercing text to numeric in E4700 / R4700C5: '1'
## Warning: Coercing text to numeric in E4701 / R4701C5: '1'
## Warning: Coercing text to numeric in E4702 / R4702C5: '1'
## Warning: Coercing text to numeric in E4703 / R4703C5: '1'
## Warning: Coercing text to numeric in E4704 / R4704C5: '1'
## Warning: Coercing text to numeric in E4705 / R4705C5: '1'
## Warning: Coercing text to numeric in E4706 / R4706C5: '1'
## Warning: Coercing text to numeric in E4707 / R4707C5: '1'
## Warning: Coercing text to numeric in E4708 / R4708C5: '1'
## Warning: Coercing text to numeric in E4709 / R4709C5: '1'
## Warning: Coercing text to numeric in E4710 / R4710C5: '1'
## Warning: Coercing text to numeric in E4711 / R4711C5: '1'
## Warning: Coercing text to numeric in E4712 / R4712C5: '2'
## Warning: Coercing text to numeric in E4713 / R4713C5: '2'
## Warning: Coercing text to numeric in E4714 / R4714C5: '2'
## Warning: Coercing text to numeric in E4715 / R4715C5: '2'
## Warning: Coercing text to numeric in E4716 / R4716C5: '2'
## Warning: Coercing text to numeric in E4717 / R4717C5: '2'
## Warning: Coercing text to numeric in E4718 / R4718C5: '2'
## Warning: Coercing text to numeric in E4719 / R4719C5: '2'
## Warning: Coercing text to numeric in E4720 / R4720C5: '2'
## Warning: Coercing text to numeric in E4721 / R4721C5: '2'
## Warning: Coercing text to numeric in E4722 / R4722C5: '2'
## Warning: Coercing text to numeric in E4723 / R4723C5: '2'
## Warning: Coercing text to numeric in E4724 / R4724C5: '1'
## Warning: Coercing text to numeric in E4725 / R4725C5: '1'
## Warning: Coercing text to numeric in E4726 / R4726C5: '1'
## Warning: Coercing text to numeric in E4727 / R4727C5: '1'
## Warning: Coercing text to numeric in E4728 / R4728C5: '1'
## Warning: Coercing text to numeric in E4729 / R4729C5: '1'
## Warning: Coercing text to numeric in E4730 / R4730C5: '2'
## Warning: Coercing text to numeric in E4731 / R4731C5: '2'
## Warning: Coercing text to numeric in E4732 / R4732C5: '2'
## Warning: Coercing text to numeric in E4733 / R4733C5: '2'
## Warning: Coercing text to numeric in E4734 / R4734C5: '2'
## Warning: Coercing text to numeric in E4735 / R4735C5: '2'
## Warning: Coercing text to numeric in E4736 / R4736C5: '1'
## Warning: Coercing text to numeric in E4737 / R4737C5: '1'
## Warning: Coercing text to numeric in E4738 / R4738C5: '1'
## Warning: Coercing text to numeric in E4739 / R4739C5: '1'
## Warning: Coercing text to numeric in E4740 / R4740C5: '1'
## Warning: Coercing text to numeric in E4741 / R4741C5: '1'
## Warning: Coercing text to numeric in E4742 / R4742C5: '1'
## Warning: Coercing text to numeric in E4743 / R4743C5: '1'
## Warning: Coercing text to numeric in E4744 / R4744C5: '1'
## Warning: Coercing text to numeric in E4745 / R4745C5: '1'
## Warning: Coercing text to numeric in E4746 / R4746C5: '1'
## Warning: Coercing text to numeric in E4747 / R4747C5: '1'
## Warning: Coercing text to numeric in E4748 / R4748C5: '1'
## Warning: Coercing text to numeric in E4749 / R4749C5: '1'
## Warning: Coercing text to numeric in E4750 / R4750C5: '1'
## Warning: Coercing text to numeric in E4751 / R4751C5: '1'
## Warning: Coercing text to numeric in E4752 / R4752C5: '1'
## Warning: Coercing text to numeric in E4753 / R4753C5: '1'
## Warning: Coercing text to numeric in E4754 / R4754C5: '2'
## Warning: Coercing text to numeric in E4755 / R4755C5: '2'
## Warning: Coercing text to numeric in E4756 / R4756C5: '2'
## Warning: Coercing text to numeric in E4757 / R4757C5: '2'
## Warning: Coercing text to numeric in E4758 / R4758C5: '2'
## Warning: Coercing text to numeric in E4759 / R4759C5: '2'
## Warning: Coercing text to numeric in E4760 / R4760C5: '2'
## Warning: Coercing text to numeric in E4761 / R4761C5: '2'
## Warning: Coercing text to numeric in E4762 / R4762C5: '2'
## Warning: Coercing text to numeric in E4763 / R4763C5: '2'
## Warning: Coercing text to numeric in E4764 / R4764C5: '2'
## Warning: Coercing text to numeric in E4765 / R4765C5: '2'
## Warning: Coercing text to numeric in E4766 / R4766C5: '1'
## Warning: Coercing text to numeric in E4767 / R4767C5: '1'
## Warning: Coercing text to numeric in E4768 / R4768C5: '1'
## Warning: Coercing text to numeric in E4769 / R4769C5: '1'
## Warning: Coercing text to numeric in E4770 / R4770C5: '1'
## Warning: Coercing text to numeric in E4771 / R4771C5: '1'
## Warning: Coercing text to numeric in E4772 / R4772C5: '1'
## Warning: Coercing text to numeric in E4773 / R4773C5: '1'
## Warning: Coercing text to numeric in E4774 / R4774C5: '1'
## Warning: Coercing text to numeric in E4775 / R4775C5: '1'
## Warning: Coercing text to numeric in E4776 / R4776C5: '1'
## Warning: Coercing text to numeric in E4777 / R4777C5: '1'
## Warning: Coercing text to numeric in E4778 / R4778C5: '1'
## Warning: Coercing text to numeric in E4779 / R4779C5: '1'
## Warning: Coercing text to numeric in E4780 / R4780C5: '1'
## Warning: Coercing text to numeric in E4781 / R4781C5: '1'
## Warning: Coercing text to numeric in E4782 / R4782C5: '1'
## Warning: Coercing text to numeric in E4783 / R4783C5: '1'
## Warning: Coercing text to numeric in E4784 / R4784C5: '2'
## Warning: Coercing text to numeric in E4785 / R4785C5: '2'
## Warning: Coercing text to numeric in E4786 / R4786C5: '2'
## Warning: Coercing text to numeric in E4787 / R4787C5: '2'
## Warning: Coercing text to numeric in E4788 / R4788C5: '2'
## Warning: Coercing text to numeric in E4789 / R4789C5: '2'
## Warning: Coercing text to numeric in E4790 / R4790C5: '1'
## Warning: Coercing text to numeric in E4791 / R4791C5: '1'
## Warning: Coercing text to numeric in E4792 / R4792C5: '1'
## Warning: Coercing text to numeric in E4793 / R4793C5: '1'
## Warning: Coercing text to numeric in E4794 / R4794C5: '1'
## Warning: Coercing text to numeric in E4795 / R4795C5: '1'
## Warning: Coercing text to numeric in E4796 / R4796C5: '1'
## Warning: Coercing text to numeric in E4797 / R4797C5: '1'
## Warning: Coercing text to numeric in E4798 / R4798C5: '1'
## Warning: Coercing text to numeric in E4799 / R4799C5: '1'
## Warning: Coercing text to numeric in E4800 / R4800C5: '1'
## Warning: Coercing text to numeric in E4801 / R4801C5: '1'
## Warning: Coercing text to numeric in E4802 / R4802C5: '2'
## Warning: Coercing text to numeric in E4803 / R4803C5: '2'
## Warning: Coercing text to numeric in E4804 / R4804C5: '2'
## Warning: Coercing text to numeric in E4805 / R4805C5: '2'
## Warning: Coercing text to numeric in E4806 / R4806C5: '2'
## Warning: Coercing text to numeric in E4807 / R4807C5: '2'
## Warning: Coercing text to numeric in E4808 / R4808C5: '1'
## Warning: Coercing text to numeric in E4809 / R4809C5: '1'
## Warning: Coercing text to numeric in E4810 / R4810C5: '1'
## Warning: Coercing text to numeric in E4811 / R4811C5: '1'
## Warning: Coercing text to numeric in E4812 / R4812C5: '1'
## Warning: Coercing text to numeric in E4813 / R4813C5: '1'
## Warning: Coercing text to numeric in E4814 / R4814C5: '2'
## Warning: Coercing text to numeric in E4815 / R4815C5: '2'
## Warning: Coercing text to numeric in E4816 / R4816C5: '2'
## Warning: Coercing text to numeric in E4817 / R4817C5: '2'
## Warning: Coercing text to numeric in E4818 / R4818C5: '2'
## Warning: Coercing text to numeric in E4819 / R4819C5: '2'
## Warning: Coercing text to numeric in E4820 / R4820C5: '1'
## Warning: Coercing text to numeric in E4821 / R4821C5: '1'
## Warning: Coercing text to numeric in E4822 / R4822C5: '1'
## Warning: Coercing text to numeric in E4823 / R4823C5: '1'
## Warning: Coercing text to numeric in E4824 / R4824C5: '1'
## Warning: Coercing text to numeric in E4825 / R4825C5: '1'
## Warning: Coercing text to numeric in E4826 / R4826C5: '2'
## Warning: Coercing text to numeric in E4827 / R4827C5: '2'
## Warning: Coercing text to numeric in E4828 / R4828C5: '2'
## Warning: Coercing text to numeric in E4829 / R4829C5: '2'
## Warning: Coercing text to numeric in E4830 / R4830C5: '2'
## Warning: Coercing text to numeric in E4831 / R4831C5: '2'
## Warning: Coercing text to numeric in E4832 / R4832C5: '1'
## Warning: Coercing text to numeric in E4833 / R4833C5: '1'
## Warning: Coercing text to numeric in E4834 / R4834C5: '1'
## Warning: Coercing text to numeric in E4835 / R4835C5: '1'
## Warning: Coercing text to numeric in E4836 / R4836C5: '1'
## Warning: Coercing text to numeric in E4837 / R4837C5: '1'
## Warning: Coercing text to numeric in E4838 / R4838C5: '2'
## Warning: Coercing text to numeric in E4839 / R4839C5: '2'
## Warning: Coercing text to numeric in E4840 / R4840C5: '2'
## Warning: Coercing text to numeric in E4841 / R4841C5: '2'
## Warning: Coercing text to numeric in E4842 / R4842C5: '2'
## Warning: Coercing text to numeric in E4843 / R4843C5: '2'
## Warning: Coercing text to numeric in E4844 / R4844C5: '1'
## Warning: Coercing text to numeric in E4845 / R4845C5: '1'
## Warning: Coercing text to numeric in E4846 / R4846C5: '1'
## Warning: Coercing text to numeric in E4847 / R4847C5: '1'
## Warning: Coercing text to numeric in E4848 / R4848C5: '1'
## Warning: Coercing text to numeric in E4849 / R4849C5: '1'
## Warning: Coercing text to numeric in E4850 / R4850C5: '2'
## Warning: Coercing text to numeric in E4851 / R4851C5: '2'
## Warning: Coercing text to numeric in E4852 / R4852C5: '2'
## Warning: Coercing text to numeric in E4853 / R4853C5: '2'
## Warning: Coercing text to numeric in E4854 / R4854C5: '2'
## Warning: Coercing text to numeric in E4855 / R4855C5: '2'
## Warning: Coercing text to numeric in E4856 / R4856C5: '1'
## Warning: Coercing text to numeric in E4857 / R4857C5: '1'
## Warning: Coercing text to numeric in E4858 / R4858C5: '1'
## Warning: Coercing text to numeric in E4859 / R4859C5: '1'
## Warning: Coercing text to numeric in E4860 / R4860C5: '1'
## Warning: Coercing text to numeric in E4861 / R4861C5: '1'
## Warning: Coercing text to numeric in E4862 / R4862C5: '2'
## Warning: Coercing text to numeric in E4863 / R4863C5: '2'
## Warning: Coercing text to numeric in E4864 / R4864C5: '2'
## Warning: Coercing text to numeric in E4865 / R4865C5: '2'
## Warning: Coercing text to numeric in E4866 / R4866C5: '2'
## Warning: Coercing text to numeric in E4867 / R4867C5: '2'
## Warning: Coercing text to numeric in E4868 / R4868C5: '2'
## Warning: Coercing text to numeric in E4869 / R4869C5: '2'
## Warning: Coercing text to numeric in E4870 / R4870C5: '2'
## Warning: Coercing text to numeric in E4871 / R4871C5: '2'
## Warning: Coercing text to numeric in E4872 / R4872C5: '2'
## Warning: Coercing text to numeric in E4873 / R4873C5: '2'
## Warning: Coercing text to numeric in E4874 / R4874C5: '2'
## Warning: Coercing text to numeric in E4875 / R4875C5: '2'
## Warning: Coercing text to numeric in E4876 / R4876C5: '2'
## Warning: Coercing text to numeric in E4877 / R4877C5: '2'
## Warning: Coercing text to numeric in E4878 / R4878C5: '2'
## Warning: Coercing text to numeric in E4879 / R4879C5: '2'
## Warning: Coercing text to numeric in E4880 / R4880C5: '2'
## Warning: Coercing text to numeric in E4881 / R4881C5: '2'
## Warning: Coercing text to numeric in E4882 / R4882C5: '2'
## Warning: Coercing text to numeric in E4883 / R4883C5: '2'
## Warning: Coercing text to numeric in E4884 / R4884C5: '2'
## Warning: Coercing text to numeric in E4885 / R4885C5: '2'
## Warning: Coercing text to numeric in E4886 / R4886C5: '1'
## Warning: Coercing text to numeric in E4887 / R4887C5: '1'
## Warning: Coercing text to numeric in E4888 / R4888C5: '1'
## Warning: Coercing text to numeric in E4889 / R4889C5: '1'
## Warning: Coercing text to numeric in E4890 / R4890C5: '1'
## Warning: Coercing text to numeric in E4891 / R4891C5: '1'
## Warning: Coercing text to numeric in E4892 / R4892C5: '2'
## Warning: Coercing text to numeric in E4893 / R4893C5: '2'
## Warning: Coercing text to numeric in E4894 / R4894C5: '2'
## Warning: Coercing text to numeric in E4895 / R4895C5: '2'
## Warning: Coercing text to numeric in E4896 / R4896C5: '2'
## Warning: Coercing text to numeric in E4897 / R4897C5: '2'
## Warning: Coercing text to numeric in E4898 / R4898C5: '2'
## Warning: Coercing text to numeric in E4899 / R4899C5: '2'
## Warning: Coercing text to numeric in E4900 / R4900C5: '2'
## Warning: Coercing text to numeric in E4901 / R4901C5: '2'
## Warning: Coercing text to numeric in E4902 / R4902C5: '2'
## Warning: Coercing text to numeric in E4903 / R4903C5: '2'
## Warning: Coercing text to numeric in E4904 / R4904C5: '1'
## Warning: Coercing text to numeric in E4905 / R4905C5: '1'
## Warning: Coercing text to numeric in E4906 / R4906C5: '1'
## Warning: Coercing text to numeric in E4907 / R4907C5: '1'
## Warning: Coercing text to numeric in E4908 / R4908C5: '1'
## Warning: Coercing text to numeric in E4909 / R4909C5: '1'
## Warning: Coercing text to numeric in E4910 / R4910C5: '1'
## Warning: Coercing text to numeric in E4911 / R4911C5: '1'
## Warning: Coercing text to numeric in E4912 / R4912C5: '1'
## Warning: Coercing text to numeric in E4913 / R4913C5: '1'
## Warning: Coercing text to numeric in E4914 / R4914C5: '1'
## Warning: Coercing text to numeric in E4915 / R4915C5: '1'
## Warning: Coercing text to numeric in E4916 / R4916C5: '1'
## Warning: Coercing text to numeric in E4917 / R4917C5: '1'
## Warning: Coercing text to numeric in E4918 / R4918C5: '1'
## Warning: Coercing text to numeric in E4919 / R4919C5: '1'
## Warning: Coercing text to numeric in E4920 / R4920C5: '1'
## Warning: Coercing text to numeric in E4921 / R4921C5: '1'
## Warning: Coercing text to numeric in E4922 / R4922C5: '1'
## Warning: Coercing text to numeric in E4923 / R4923C5: '1'
## Warning: Coercing text to numeric in E4924 / R4924C5: '1'
## Warning: Coercing text to numeric in E4925 / R4925C5: '1'
## Warning: Coercing text to numeric in E4926 / R4926C5: '1'
## Warning: Coercing text to numeric in E4927 / R4927C5: '1'
## Warning: Coercing text to numeric in E4928 / R4928C5: '1'
## Warning: Coercing text to numeric in E4929 / R4929C5: '1'
## Warning: Coercing text to numeric in E4930 / R4930C5: '1'
## Warning: Coercing text to numeric in E4931 / R4931C5: '1'
## Warning: Coercing text to numeric in E4932 / R4932C5: '1'
## Warning: Coercing text to numeric in E4933 / R4933C5: '1'
## Warning: Coercing text to numeric in E4934 / R4934C5: '1'
## Warning: Coercing text to numeric in E4935 / R4935C5: '1'
## Warning: Coercing text to numeric in E4936 / R4936C5: '1'
## Warning: Coercing text to numeric in E4937 / R4937C5: '1'
## Warning: Coercing text to numeric in E4938 / R4938C5: '1'
## Warning: Coercing text to numeric in E4939 / R4939C5: '1'
## Warning: Coercing text to numeric in E4940 / R4940C5: '1'
## Warning: Coercing text to numeric in E4941 / R4941C5: '1'
## Warning: Coercing text to numeric in E4942 / R4942C5: '1'
## Warning: Coercing text to numeric in E4943 / R4943C5: '1'
## Warning: Coercing text to numeric in E4944 / R4944C5: '1'
## Warning: Coercing text to numeric in E4945 / R4945C5: '1'
## Warning: Coercing text to numeric in E4946 / R4946C5: '2'
## Warning: Coercing text to numeric in E4947 / R4947C5: '2'
## Warning: Coercing text to numeric in E4948 / R4948C5: '2'
## Warning: Coercing text to numeric in E4949 / R4949C5: '2'
## Warning: Coercing text to numeric in E4950 / R4950C5: '2'
## Warning: Coercing text to numeric in E4951 / R4951C5: '2'
## Warning: Coercing text to numeric in E4952 / R4952C5: '2'
## Warning: Coercing text to numeric in E4953 / R4953C5: '2'
## Warning: Coercing text to numeric in E4954 / R4954C5: '2'
## Warning: Coercing text to numeric in E4955 / R4955C5: '2'
## Warning: Coercing text to numeric in E4956 / R4956C5: '2'
## Warning: Coercing text to numeric in E4957 / R4957C5: '2'
## Warning: Coercing text to numeric in E4958 / R4958C5: '1'
## Warning: Coercing text to numeric in E4959 / R4959C5: '1'
## Warning: Coercing text to numeric in E4960 / R4960C5: '1'
## Warning: Coercing text to numeric in E4961 / R4961C5: '1'
## Warning: Coercing text to numeric in E4962 / R4962C5: '1'
## Warning: Coercing text to numeric in E4963 / R4963C5: '1'
## Warning: Coercing text to numeric in E4964 / R4964C5: '1'
## Warning: Coercing text to numeric in E4965 / R4965C5: '1'
## Warning: Coercing text to numeric in E4966 / R4966C5: '1'
## Warning: Coercing text to numeric in E4967 / R4967C5: '1'
## Warning: Coercing text to numeric in E4968 / R4968C5: '1'
## Warning: Coercing text to numeric in E4969 / R4969C5: '1'
## Warning: Coercing text to numeric in E4970 / R4970C5: '1'
## Warning: Coercing text to numeric in E4971 / R4971C5: '1'
## Warning: Coercing text to numeric in E4972 / R4972C5: '1'
## Warning: Coercing text to numeric in E4973 / R4973C5: '1'
## Warning: Coercing text to numeric in E4974 / R4974C5: '1'
## Warning: Coercing text to numeric in E4975 / R4975C5: '1'
## Warning: Coercing text to numeric in E4976 / R4976C5: '1'
## Warning: Coercing text to numeric in E4977 / R4977C5: '1'
## Warning: Coercing text to numeric in E4978 / R4978C5: '1'
## Warning: Coercing text to numeric in E4979 / R4979C5: '1'
## Warning: Coercing text to numeric in E4980 / R4980C5: '1'
## Warning: Coercing text to numeric in E4981 / R4981C5: '1'
## Warning: Coercing text to numeric in E4982 / R4982C5: '2'
## Warning: Coercing text to numeric in E4983 / R4983C5: '2'
## Warning: Coercing text to numeric in E4984 / R4984C5: '2'
## Warning: Coercing text to numeric in E4985 / R4985C5: '2'
## Warning: Coercing text to numeric in E4986 / R4986C5: '2'
## Warning: Coercing text to numeric in E4987 / R4987C5: '2'
## Warning: Coercing text to numeric in E4988 / R4988C5: '1'
## Warning: Coercing text to numeric in E4989 / R4989C5: '1'
## Warning: Coercing text to numeric in E4990 / R4990C5: '1'
## Warning: Coercing text to numeric in E4991 / R4991C5: '1'
## Warning: Coercing text to numeric in E4992 / R4992C5: '1'
## Warning: Coercing text to numeric in E4993 / R4993C5: '1'
## Warning: Coercing text to numeric in E4994 / R4994C5: '1'
## Warning: Coercing text to numeric in E4995 / R4995C5: '1'
## Warning: Coercing text to numeric in E4996 / R4996C5: '1'
## Warning: Coercing text to numeric in E4997 / R4997C5: '1'
## Warning: Coercing text to numeric in E4998 / R4998C5: '1'
## Warning: Coercing text to numeric in E4999 / R4999C5: '1'
## Warning: Coercing text to numeric in E5000 / R5000C5: '2'
## Warning: Coercing text to numeric in E5001 / R5001C5: '2'
## Warning: Coercing text to numeric in E5002 / R5002C5: '2'
## Warning: Coercing text to numeric in E5003 / R5003C5: '2'
## Warning: Coercing text to numeric in E5004 / R5004C5: '2'
## Warning: Coercing text to numeric in E5005 / R5005C5: '2'
## Warning: Coercing text to numeric in E5006 / R5006C5: '2'
## Warning: Coercing text to numeric in E5007 / R5007C5: '2'
## Warning: Coercing text to numeric in E5008 / R5008C5: '2'
## Warning: Coercing text to numeric in E5009 / R5009C5: '2'
## Warning: Coercing text to numeric in E5010 / R5010C5: '2'
## Warning: Coercing text to numeric in E5011 / R5011C5: '2'
## Warning: Coercing text to numeric in E5012 / R5012C5: '2'
## Warning: Coercing text to numeric in E5013 / R5013C5: '2'
## Warning: Coercing text to numeric in E5014 / R5014C5: '2'
## Warning: Coercing text to numeric in E5015 / R5015C5: '2'
## Warning: Coercing text to numeric in E5016 / R5016C5: '2'
## Warning: Coercing text to numeric in E5017 / R5017C5: '2'
## Warning: Coercing text to numeric in E5018 / R5018C5: '2'
## Warning: Coercing text to numeric in E5019 / R5019C5: '2'
## Warning: Coercing text to numeric in E5020 / R5020C5: '2'
## Warning: Coercing text to numeric in E5021 / R5021C5: '2'
## Warning: Coercing text to numeric in E5022 / R5022C5: '2'
## Warning: Coercing text to numeric in E5023 / R5023C5: '2'
## Warning: Coercing text to numeric in E5024 / R5024C5: '2'
## Warning: Coercing text to numeric in E5025 / R5025C5: '2'
## Warning: Coercing text to numeric in E5026 / R5026C5: '2'
## Warning: Coercing text to numeric in E5027 / R5027C5: '2'
## Warning: Coercing text to numeric in E5028 / R5028C5: '2'
## Warning: Coercing text to numeric in E5029 / R5029C5: '2'
## Warning: Coercing text to numeric in E5030 / R5030C5: '2'
## Warning: Coercing text to numeric in E5031 / R5031C5: '2'
## Warning: Coercing text to numeric in E5032 / R5032C5: '2'
## Warning: Coercing text to numeric in E5033 / R5033C5: '2'
## Warning: Coercing text to numeric in E5034 / R5034C5: '2'
## Warning: Coercing text to numeric in E5035 / R5035C5: '2'
## Warning: Coercing text to numeric in E5036 / R5036C5: '2'
## Warning: Coercing text to numeric in E5037 / R5037C5: '2'
## Warning: Coercing text to numeric in E5038 / R5038C5: '2'
## Warning: Coercing text to numeric in E5039 / R5039C5: '2'
## Warning: Coercing text to numeric in E5040 / R5040C5: '2'
## Warning: Coercing text to numeric in E5041 / R5041C5: '2'
## Warning: Coercing text to numeric in E5042 / R5042C5: '1'
## Warning: Coercing text to numeric in E5043 / R5043C5: '1'
## Warning: Coercing text to numeric in E5044 / R5044C5: '1'
## Warning: Coercing text to numeric in E5045 / R5045C5: '1'
## Warning: Coercing text to numeric in E5046 / R5046C5: '1'
## Warning: Coercing text to numeric in E5047 / R5047C5: '1'
## Warning: Coercing text to numeric in E5048 / R5048C5: '2'
## Warning: Coercing text to numeric in E5049 / R5049C5: '2'
## Warning: Coercing text to numeric in E5050 / R5050C5: '2'
## Warning: Coercing text to numeric in E5051 / R5051C5: '2'
## Warning: Coercing text to numeric in E5052 / R5052C5: '2'
## Warning: Coercing text to numeric in E5053 / R5053C5: '2'
## Warning: Coercing text to numeric in E5054 / R5054C5: '2'
## Warning: Coercing text to numeric in E5055 / R5055C5: '2'
## Warning: Coercing text to numeric in E5056 / R5056C5: '2'
## Warning: Coercing text to numeric in E5057 / R5057C5: '2'
## Warning: Coercing text to numeric in E5058 / R5058C5: '2'
## Warning: Coercing text to numeric in E5059 / R5059C5: '2'
## Warning: Coercing text to numeric in E5060 / R5060C5: '2'
## Warning: Coercing text to numeric in E5061 / R5061C5: '2'
## Warning: Coercing text to numeric in E5062 / R5062C5: '2'
## Warning: Coercing text to numeric in E5063 / R5063C5: '2'
## Warning: Coercing text to numeric in E5064 / R5064C5: '2'
## Warning: Coercing text to numeric in E5065 / R5065C5: '2'
## Warning: Coercing text to numeric in E5066 / R5066C5: '2'
## Warning: Coercing text to numeric in E5067 / R5067C5: '2'
## Warning: Coercing text to numeric in E5068 / R5068C5: '2'
## Warning: Coercing text to numeric in E5069 / R5069C5: '2'
## Warning: Coercing text to numeric in E5070 / R5070C5: '2'
## Warning: Coercing text to numeric in E5071 / R5071C5: '2'
## Warning: Coercing text to numeric in E5072 / R5072C5: '1'
## Warning: Coercing text to numeric in E5073 / R5073C5: '1'
## Warning: Coercing text to numeric in E5074 / R5074C5: '1'
## Warning: Coercing text to numeric in E5075 / R5075C5: '1'
## Warning: Coercing text to numeric in E5076 / R5076C5: '1'
## Warning: Coercing text to numeric in E5077 / R5077C5: '1'
## Warning: Coercing text to numeric in E5078 / R5078C5: '2'
## Warning: Coercing text to numeric in E5079 / R5079C5: '2'
## Warning: Coercing text to numeric in E5080 / R5080C5: '2'
## Warning: Coercing text to numeric in E5081 / R5081C5: '2'
## Warning: Coercing text to numeric in E5082 / R5082C5: '2'
## Warning: Coercing text to numeric in E5083 / R5083C5: '2'
## Warning: Coercing text to numeric in E5084 / R5084C5: '2'
## Warning: Coercing text to numeric in E5085 / R5085C5: '2'
## Warning: Coercing text to numeric in E5086 / R5086C5: '2'
## Warning: Coercing text to numeric in E5087 / R5087C5: '2'
## Warning: Coercing text to numeric in E5088 / R5088C5: '2'
## Warning: Coercing text to numeric in E5089 / R5089C5: '2'
## Warning: Coercing text to numeric in E5090 / R5090C5: '2'
## Warning: Coercing text to numeric in E5091 / R5091C5: '2'
## Warning: Coercing text to numeric in E5092 / R5092C5: '2'
## Warning: Coercing text to numeric in E5093 / R5093C5: '2'
## Warning: Coercing text to numeric in E5094 / R5094C5: '2'
## Warning: Coercing text to numeric in E5095 / R5095C5: '2'
## Warning: Coercing text to numeric in E5096 / R5096C5: '1'
## Warning: Coercing text to numeric in E5097 / R5097C5: '1'
## Warning: Coercing text to numeric in E5098 / R5098C5: '1'
## Warning: Coercing text to numeric in E5099 / R5099C5: '1'
## Warning: Coercing text to numeric in E5100 / R5100C5: '1'
## Warning: Coercing text to numeric in E5101 / R5101C5: '1'
## Warning: Coercing text to numeric in E5102 / R5102C5: '1'
## Warning: Coercing text to numeric in E5103 / R5103C5: '1'
## Warning: Coercing text to numeric in E5104 / R5104C5: '1'
## Warning: Coercing text to numeric in E5105 / R5105C5: '1'
## Warning: Coercing text to numeric in E5106 / R5106C5: '1'
## Warning: Coercing text to numeric in E5107 / R5107C5: '1'
## Warning: Coercing text to numeric in E5108 / R5108C5: '1'
## Warning: Coercing text to numeric in E5109 / R5109C5: '1'
## Warning: Coercing text to numeric in E5110 / R5110C5: '1'
## Warning: Coercing text to numeric in E5111 / R5111C5: '1'
## Warning: Coercing text to numeric in E5112 / R5112C5: '1'
## Warning: Coercing text to numeric in E5113 / R5113C5: '1'
## Warning: Coercing text to numeric in E5114 / R5114C5: '2'
## Warning: Coercing text to numeric in E5115 / R5115C5: '2'
## Warning: Coercing text to numeric in E5116 / R5116C5: '2'
## Warning: Coercing text to numeric in E5117 / R5117C5: '2'
## Warning: Coercing text to numeric in E5118 / R5118C5: '2'
## Warning: Coercing text to numeric in E5119 / R5119C5: '2'
## Warning: Coercing text to numeric in E5120 / R5120C5: '1'
## Warning: Coercing text to numeric in E5121 / R5121C5: '1'
## Warning: Coercing text to numeric in E5122 / R5122C5: '1'
## Warning: Coercing text to numeric in E5123 / R5123C5: '1'
## Warning: Coercing text to numeric in E5124 / R5124C5: '1'
## Warning: Coercing text to numeric in E5125 / R5125C5: '1'
## Warning: Coercing text to numeric in E5126 / R5126C5: '1'
## Warning: Coercing text to numeric in E5127 / R5127C5: '1'
## Warning: Coercing text to numeric in E5128 / R5128C5: '1'
## Warning: Coercing text to numeric in E5129 / R5129C5: '1'
## Warning: Coercing text to numeric in E5130 / R5130C5: '1'
## Warning: Coercing text to numeric in E5131 / R5131C5: '1'
## Warning: Coercing text to numeric in E5132 / R5132C5: '1'
## Warning: Coercing text to numeric in E5133 / R5133C5: '1'
## Warning: Coercing text to numeric in E5134 / R5134C5: '1'
## Warning: Coercing text to numeric in E5135 / R5135C5: '1'
## Warning: Coercing text to numeric in E5136 / R5136C5: '1'
## Warning: Coercing text to numeric in E5137 / R5137C5: '1'
## Warning: Coercing text to numeric in E5138 / R5138C5: '1'
## Warning: Coercing text to numeric in E5139 / R5139C5: '1'
## Warning: Coercing text to numeric in E5140 / R5140C5: '1'
## Warning: Coercing text to numeric in E5141 / R5141C5: '1'
## Warning: Coercing text to numeric in E5142 / R5142C5: '1'
## Warning: Coercing text to numeric in E5143 / R5143C5: '1'
## Warning: Coercing text to numeric in E5144 / R5144C5: '1'
## Warning: Coercing text to numeric in E5145 / R5145C5: '1'
## Warning: Coercing text to numeric in E5146 / R5146C5: '1'
## Warning: Coercing text to numeric in E5147 / R5147C5: '1'
## Warning: Coercing text to numeric in E5148 / R5148C5: '1'
## Warning: Coercing text to numeric in E5149 / R5149C5: '1'
## Warning: Coercing text to numeric in E5150 / R5150C5: '2'
## Warning: Coercing text to numeric in E5151 / R5151C5: '2'
## Warning: Coercing text to numeric in E5152 / R5152C5: '2'
## Warning: Coercing text to numeric in E5153 / R5153C5: '2'
## Warning: Coercing text to numeric in E5154 / R5154C5: '2'
## Warning: Coercing text to numeric in E5155 / R5155C5: '2'
## Warning: Coercing text to numeric in E5156 / R5156C5: '1'
## Warning: Coercing text to numeric in E5157 / R5157C5: '1'
## Warning: Coercing text to numeric in E5158 / R5158C5: '1'
## Warning: Coercing text to numeric in E5159 / R5159C5: '1'
## Warning: Coercing text to numeric in E5160 / R5160C5: '1'
## Warning: Coercing text to numeric in E5161 / R5161C5: '1'
## Warning: Coercing text to numeric in E5162 / R5162C5: '2'
## Warning: Coercing text to numeric in E5163 / R5163C5: '2'
## Warning: Coercing text to numeric in E5164 / R5164C5: '2'
## Warning: Coercing text to numeric in E5165 / R5165C5: '2'
## Warning: Coercing text to numeric in E5166 / R5166C5: '2'
## Warning: Coercing text to numeric in E5167 / R5167C5: '2'
## Warning: Coercing text to numeric in E5168 / R5168C5: '2'
## Warning: Coercing text to numeric in E5169 / R5169C5: '2'
## Warning: Coercing text to numeric in E5170 / R5170C5: '2'
## Warning: Coercing text to numeric in E5171 / R5171C5: '2'
## Warning: Coercing text to numeric in E5172 / R5172C5: '2'
## Warning: Coercing text to numeric in E5173 / R5173C5: '2'
## Warning: Coercing text to numeric in E5174 / R5174C5: '1'
## Warning: Coercing text to numeric in E5175 / R5175C5: '1'
## Warning: Coercing text to numeric in E5176 / R5176C5: '1'
## Warning: Coercing text to numeric in E5177 / R5177C5: '1'
## Warning: Coercing text to numeric in E5178 / R5178C5: '1'
## Warning: Coercing text to numeric in E5179 / R5179C5: '1'
## Warning: Coercing text to numeric in E5180 / R5180C5: '1'
## Warning: Coercing text to numeric in E5181 / R5181C5: '1'
## Warning: Coercing text to numeric in E5182 / R5182C5: '1'
## Warning: Coercing text to numeric in E5183 / R5183C5: '1'
## Warning: Coercing text to numeric in E5184 / R5184C5: '1'
## Warning: Coercing text to numeric in E5185 / R5185C5: '1'
## Warning: Coercing text to numeric in E5186 / R5186C5: '2'
## Warning: Coercing text to numeric in E5187 / R5187C5: '2'
## Warning: Coercing text to numeric in E5188 / R5188C5: '2'
## Warning: Coercing text to numeric in E5189 / R5189C5: '2'
## Warning: Coercing text to numeric in E5190 / R5190C5: '2'
## Warning: Coercing text to numeric in E5191 / R5191C5: '2'
## Warning: Coercing text to numeric in E5192 / R5192C5: '2'
## Warning: Coercing text to numeric in E5193 / R5193C5: '2'
## Warning: Coercing text to numeric in E5194 / R5194C5: '2'
## Warning: Coercing text to numeric in E5195 / R5195C5: '2'
## Warning: Coercing text to numeric in E5196 / R5196C5: '2'
## Warning: Coercing text to numeric in E5197 / R5197C5: '2'
## Warning: Coercing text to numeric in E5198 / R5198C5: '1'
## Warning: Coercing text to numeric in E5199 / R5199C5: '1'
## Warning: Coercing text to numeric in E5200 / R5200C5: '1'
## Warning: Coercing text to numeric in E5201 / R5201C5: '1'
## Warning: Coercing text to numeric in E5202 / R5202C5: '1'
## Warning: Coercing text to numeric in E5203 / R5203C5: '1'
## Warning: Coercing text to numeric in E5204 / R5204C5: '2'
## Warning: Coercing text to numeric in E5205 / R5205C5: '2'
## Warning: Coercing text to numeric in E5206 / R5206C5: '2'
## Warning: Coercing text to numeric in E5207 / R5207C5: '2'
## Warning: Coercing text to numeric in E5208 / R5208C5: '2'
## Warning: Coercing text to numeric in E5209 / R5209C5: '2'
## Warning: Coercing text to numeric in E5210 / R5210C5: '1'
## Warning: Coercing text to numeric in E5211 / R5211C5: '1'
## Warning: Coercing text to numeric in E5212 / R5212C5: '1'
## Warning: Coercing text to numeric in E5213 / R5213C5: '1'
## Warning: Coercing text to numeric in E5214 / R5214C5: '1'
## Warning: Coercing text to numeric in E5215 / R5215C5: '1'
## Warning: Coercing text to numeric in E5216 / R5216C5: '2'
## Warning: Coercing text to numeric in E5217 / R5217C5: '2'
## Warning: Coercing text to numeric in E5218 / R5218C5: '2'
## Warning: Coercing text to numeric in E5219 / R5219C5: '2'
## Warning: Coercing text to numeric in E5220 / R5220C5: '2'
## Warning: Coercing text to numeric in E5221 / R5221C5: '2'
## Warning: Coercing text to numeric in E5222 / R5222C5: '1'
## Warning: Coercing text to numeric in E5223 / R5223C5: '1'
## Warning: Coercing text to numeric in E5224 / R5224C5: '1'
## Warning: Coercing text to numeric in E5225 / R5225C5: '1'
## Warning: Coercing text to numeric in E5226 / R5226C5: '1'
## Warning: Coercing text to numeric in E5227 / R5227C5: '1'
## Warning: Coercing text to numeric in E5228 / R5228C5: '2'
## Warning: Coercing text to numeric in E5229 / R5229C5: '2'
## Warning: Coercing text to numeric in E5230 / R5230C5: '2'
## Warning: Coercing text to numeric in E5231 / R5231C5: '2'
## Warning: Coercing text to numeric in E5232 / R5232C5: '2'
## Warning: Coercing text to numeric in E5233 / R5233C5: '2'
## Warning: Coercing text to numeric in E5234 / R5234C5: '1'
## Warning: Coercing text to numeric in E5235 / R5235C5: '1'
## Warning: Coercing text to numeric in E5236 / R5236C5: '1'
## Warning: Coercing text to numeric in E5237 / R5237C5: '1'
## Warning: Coercing text to numeric in E5238 / R5238C5: '1'
## Warning: Coercing text to numeric in E5239 / R5239C5: '1'
## Warning: Coercing text to numeric in E5240 / R5240C5: '2'
## Warning: Coercing text to numeric in E5241 / R5241C5: '2'
## Warning: Coercing text to numeric in E5242 / R5242C5: '2'
## Warning: Coercing text to numeric in E5243 / R5243C5: '2'
## Warning: Coercing text to numeric in E5244 / R5244C5: '2'
## Warning: Coercing text to numeric in E5245 / R5245C5: '2'
## Warning: Coercing text to numeric in E5246 / R5246C5: '1'
## Warning: Coercing text to numeric in E5247 / R5247C5: '1'
## Warning: Coercing text to numeric in E5248 / R5248C5: '1'
## Warning: Coercing text to numeric in E5249 / R5249C5: '1'
## Warning: Coercing text to numeric in E5250 / R5250C5: '1'
## Warning: Coercing text to numeric in E5251 / R5251C5: '1'
## Warning: Coercing text to numeric in E5252 / R5252C5: '1'
## Warning: Coercing text to numeric in E5253 / R5253C5: '1'
## Warning: Coercing text to numeric in E5254 / R5254C5: '1'
## Warning: Coercing text to numeric in E5255 / R5255C5: '1'
## Warning: Coercing text to numeric in E5256 / R5256C5: '1'
## Warning: Coercing text to numeric in E5257 / R5257C5: '1'
## Warning: Coercing text to numeric in E5258 / R5258C5: '2'
## Warning: Coercing text to numeric in E5259 / R5259C5: '2'
## Warning: Coercing text to numeric in E5260 / R5260C5: '2'
## Warning: Coercing text to numeric in E5261 / R5261C5: '2'
## Warning: Coercing text to numeric in E5262 / R5262C5: '2'
## Warning: Coercing text to numeric in E5263 / R5263C5: '2'
## Warning: Coercing text to numeric in E5264 / R5264C5: '1'
## Warning: Coercing text to numeric in E5265 / R5265C5: '1'
## Warning: Coercing text to numeric in E5266 / R5266C5: '1'
## Warning: Coercing text to numeric in E5267 / R5267C5: '1'
## Warning: Coercing text to numeric in E5268 / R5268C5: '1'
## Warning: Coercing text to numeric in E5269 / R5269C5: '1'
## Warning: Coercing text to numeric in E5270 / R5270C5: '1'
## Warning: Coercing text to numeric in E5271 / R5271C5: '1'
## Warning: Coercing text to numeric in E5272 / R5272C5: '1'
## Warning: Coercing text to numeric in E5273 / R5273C5: '1'
## Warning: Coercing text to numeric in E5274 / R5274C5: '1'
## Warning: Coercing text to numeric in E5275 / R5275C5: '1'
## Warning: Coercing text to numeric in E5276 / R5276C5: '2'
## Warning: Coercing text to numeric in E5277 / R5277C5: '2'
## Warning: Coercing text to numeric in E5278 / R5278C5: '2'
## Warning: Coercing text to numeric in E5279 / R5279C5: '2'
## Warning: Coercing text to numeric in E5280 / R5280C5: '2'
## Warning: Coercing text to numeric in E5281 / R5281C5: '2'
## Warning: Coercing text to numeric in E5282 / R5282C5: '2'
## Warning: Coercing text to numeric in E5283 / R5283C5: '2'
## Warning: Coercing text to numeric in E5284 / R5284C5: '2'
## Warning: Coercing text to numeric in E5285 / R5285C5: '2'
## Warning: Coercing text to numeric in E5286 / R5286C5: '2'
## Warning: Coercing text to numeric in E5287 / R5287C5: '2'
## Warning: Coercing text to numeric in E5288 / R5288C5: '1'
## Warning: Coercing text to numeric in E5289 / R5289C5: '1'
## Warning: Coercing text to numeric in E5290 / R5290C5: '1'
## Warning: Coercing text to numeric in E5291 / R5291C5: '1'
## Warning: Coercing text to numeric in E5292 / R5292C5: '1'
## Warning: Coercing text to numeric in E5293 / R5293C5: '1'
## Warning: Coercing text to numeric in E5294 / R5294C5: '2'
## Warning: Coercing text to numeric in E5295 / R5295C5: '2'
## Warning: Coercing text to numeric in E5296 / R5296C5: '2'
## Warning: Coercing text to numeric in E5297 / R5297C5: '2'
## Warning: Coercing text to numeric in E5298 / R5298C5: '2'
## Warning: Coercing text to numeric in E5299 / R5299C5: '2'
## Warning: Coercing text to numeric in E5300 / R5300C5: '1'
## Warning: Coercing text to numeric in E5301 / R5301C5: '1'
## Warning: Coercing text to numeric in E5302 / R5302C5: '1'
## Warning: Coercing text to numeric in E5303 / R5303C5: '1'
## Warning: Coercing text to numeric in E5304 / R5304C5: '1'
## Warning: Coercing text to numeric in E5305 / R5305C5: '1'
## Warning: Coercing text to numeric in E5306 / R5306C5: '1'
## Warning: Coercing text to numeric in E5307 / R5307C5: '1'
## Warning: Coercing text to numeric in E5308 / R5308C5: '1'
## Warning: Coercing text to numeric in E5309 / R5309C5: '1'
## Warning: Coercing text to numeric in E5310 / R5310C5: '1'
## Warning: Coercing text to numeric in E5311 / R5311C5: '1'
## Warning: Coercing text to numeric in E5312 / R5312C5: '1'
## Warning: Coercing text to numeric in E5313 / R5313C5: '1'
## Warning: Coercing text to numeric in E5314 / R5314C5: '1'
## Warning: Coercing text to numeric in E5315 / R5315C5: '1'
## Warning: Coercing text to numeric in E5316 / R5316C5: '1'
## Warning: Coercing text to numeric in E5317 / R5317C5: '1'
## Warning: Coercing text to numeric in E5318 / R5318C5: '2'
## Warning: Coercing text to numeric in E5319 / R5319C5: '2'
## Warning: Coercing text to numeric in E5320 / R5320C5: '2'
## Warning: Coercing text to numeric in E5321 / R5321C5: '2'
## Warning: Coercing text to numeric in E5322 / R5322C5: '2'
## Warning: Coercing text to numeric in E5323 / R5323C5: '2'
## Warning: Coercing text to numeric in E5324 / R5324C5: '1'
## Warning: Coercing text to numeric in E5325 / R5325C5: '1'
## Warning: Coercing text to numeric in E5326 / R5326C5: '1'
## Warning: Coercing text to numeric in E5327 / R5327C5: '1'
## Warning: Coercing text to numeric in E5328 / R5328C5: '1'
## Warning: Coercing text to numeric in E5329 / R5329C5: '1'
## Warning: Coercing text to numeric in E5330 / R5330C5: '1'
## Warning: Coercing text to numeric in E5331 / R5331C5: '1'
## Warning: Coercing text to numeric in E5332 / R5332C5: '1'
## Warning: Coercing text to numeric in E5333 / R5333C5: '1'
## Warning: Coercing text to numeric in E5334 / R5334C5: '1'
## Warning: Coercing text to numeric in E5335 / R5335C5: '1'
## Warning: Coercing text to numeric in E5336 / R5336C5: '1'
## Warning: Coercing text to numeric in E5337 / R5337C5: '1'
## Warning: Coercing text to numeric in E5338 / R5338C5: '1'
## Warning: Coercing text to numeric in E5339 / R5339C5: '1'
## Warning: Coercing text to numeric in E5340 / R5340C5: '1'
## Warning: Coercing text to numeric in E5341 / R5341C5: '1'
## Warning: Coercing text to numeric in E5342 / R5342C5: '1'
## Warning: Coercing text to numeric in E5343 / R5343C5: '1'
## Warning: Coercing text to numeric in E5344 / R5344C5: '1'
## Warning: Coercing text to numeric in E5345 / R5345C5: '1'
## Warning: Coercing text to numeric in E5346 / R5346C5: '1'
## Warning: Coercing text to numeric in E5347 / R5347C5: '1'
## Warning: Coercing text to numeric in E5348 / R5348C5: '2'
## Warning: Coercing text to numeric in E5349 / R5349C5: '2'
## Warning: Coercing text to numeric in E5350 / R5350C5: '2'
## Warning: Coercing text to numeric in E5351 / R5351C5: '2'
## Warning: Coercing text to numeric in E5352 / R5352C5: '2'
## Warning: Coercing text to numeric in E5353 / R5353C5: '2'
## Warning: Coercing text to numeric in E5354 / R5354C5: '1'
## Warning: Coercing text to numeric in E5355 / R5355C5: '1'
## Warning: Coercing text to numeric in E5356 / R5356C5: '1'
## Warning: Coercing text to numeric in E5357 / R5357C5: '1'
## Warning: Coercing text to numeric in E5358 / R5358C5: '1'
## Warning: Coercing text to numeric in E5359 / R5359C5: '1'
## Warning: Coercing text to numeric in E5360 / R5360C5: '1'
## Warning: Coercing text to numeric in E5361 / R5361C5: '1'
## Warning: Coercing text to numeric in E5362 / R5362C5: '1'
## Warning: Coercing text to numeric in E5363 / R5363C5: '1'
## Warning: Coercing text to numeric in E5364 / R5364C5: '1'
## Warning: Coercing text to numeric in E5365 / R5365C5: '1'
## Warning: Coercing text to numeric in E5366 / R5366C5: '1'
## Warning: Coercing text to numeric in E5367 / R5367C5: '1'
## Warning: Coercing text to numeric in E5368 / R5368C5: '1'
## Warning: Coercing text to numeric in E5369 / R5369C5: '1'
## Warning: Coercing text to numeric in E5370 / R5370C5: '1'
## Warning: Coercing text to numeric in E5371 / R5371C5: '1'
## Warning: Coercing text to numeric in E5372 / R5372C5: '1'
## Warning: Coercing text to numeric in E5373 / R5373C5: '1'
## Warning: Coercing text to numeric in E5374 / R5374C5: '1'
## Warning: Coercing text to numeric in E5375 / R5375C5: '1'
## Warning: Coercing text to numeric in E5376 / R5376C5: '1'
## Warning: Coercing text to numeric in E5377 / R5377C5: '1'
## Warning: Coercing text to numeric in E5378 / R5378C5: '2'
## Warning: Coercing text to numeric in E5379 / R5379C5: '2'
## Warning: Coercing text to numeric in E5380 / R5380C5: '2'
## Warning: Coercing text to numeric in E5381 / R5381C5: '2'
## Warning: Coercing text to numeric in E5382 / R5382C5: '2'
## Warning: Coercing text to numeric in E5383 / R5383C5: '2'
## Warning: Coercing text to numeric in E5384 / R5384C5: '1'
## Warning: Coercing text to numeric in E5385 / R5385C5: '1'
## Warning: Coercing text to numeric in E5386 / R5386C5: '1'
## Warning: Coercing text to numeric in E5387 / R5387C5: '1'
## Warning: Coercing text to numeric in E5388 / R5388C5: '1'
## Warning: Coercing text to numeric in E5389 / R5389C5: '1'
## Warning: Coercing text to numeric in E5390 / R5390C5: '2'
## Warning: Coercing text to numeric in E5391 / R5391C5: '2'
## Warning: Coercing text to numeric in E5392 / R5392C5: '2'
## Warning: Coercing text to numeric in E5393 / R5393C5: '2'
## Warning: Coercing text to numeric in E5394 / R5394C5: '2'
## Warning: Coercing text to numeric in E5395 / R5395C5: '2'
## Warning: Coercing text to numeric in E5396 / R5396C5: '2'
## Warning: Coercing text to numeric in E5397 / R5397C5: '2'
## Warning: Coercing text to numeric in E5398 / R5398C5: '2'
## Warning: Coercing text to numeric in E5399 / R5399C5: '2'
## Warning: Coercing text to numeric in E5400 / R5400C5: '2'
## Warning: Coercing text to numeric in E5401 / R5401C5: '2'
## Warning: Coercing text to numeric in E5402 / R5402C5: '2'
## Warning: Coercing text to numeric in E5403 / R5403C5: '2'
## Warning: Coercing text to numeric in E5404 / R5404C5: '2'
## Warning: Coercing text to numeric in E5405 / R5405C5: '2'
## Warning: Coercing text to numeric in E5406 / R5406C5: '2'
## Warning: Coercing text to numeric in E5407 / R5407C5: '2'
## Warning: Coercing text to numeric in E5408 / R5408C5: '1'
## Warning: Coercing text to numeric in E5409 / R5409C5: '1'
## Warning: Coercing text to numeric in E5410 / R5410C5: '1'
## Warning: Coercing text to numeric in E5411 / R5411C5: '1'
## Warning: Coercing text to numeric in E5412 / R5412C5: '1'
## Warning: Coercing text to numeric in E5413 / R5413C5: '1'
## Warning: Coercing text to numeric in E5414 / R5414C5: '1'
## Warning: Coercing text to numeric in E5415 / R5415C5: '1'
## Warning: Coercing text to numeric in E5416 / R5416C5: '1'
## Warning: Coercing text to numeric in E5417 / R5417C5: '1'
## Warning: Coercing text to numeric in E5418 / R5418C5: '1'
## Warning: Coercing text to numeric in E5419 / R5419C5: '1'
## Warning: Coercing text to numeric in E5420 / R5420C5: '1'
## Warning: Coercing text to numeric in E5421 / R5421C5: '1'
## Warning: Coercing text to numeric in E5422 / R5422C5: '1'
## Warning: Coercing text to numeric in E5423 / R5423C5: '1'
## Warning: Coercing text to numeric in E5424 / R5424C5: '1'
## Warning: Coercing text to numeric in E5425 / R5425C5: '1'
## Warning: Coercing text to numeric in E5426 / R5426C5: '1'
## Warning: Coercing text to numeric in E5427 / R5427C5: '1'
## Warning: Coercing text to numeric in E5428 / R5428C5: '1'
## Warning: Coercing text to numeric in E5429 / R5429C5: '1'
## Warning: Coercing text to numeric in E5430 / R5430C5: '1'
## Warning: Coercing text to numeric in E5431 / R5431C5: '1'
## Warning: Coercing text to numeric in E5432 / R5432C5: '1'
## Warning: Coercing text to numeric in E5433 / R5433C5: '1'
## Warning: Coercing text to numeric in E5434 / R5434C5: '1'
## Warning: Coercing text to numeric in E5435 / R5435C5: '1'
## Warning: Coercing text to numeric in E5436 / R5436C5: '1'
## Warning: Coercing text to numeric in E5437 / R5437C5: '1'
## Warning: Coercing text to numeric in E5438 / R5438C5: '1'
## Warning: Coercing text to numeric in E5439 / R5439C5: '1'
## Warning: Coercing text to numeric in E5440 / R5440C5: '1'
## Warning: Coercing text to numeric in E5441 / R5441C5: '1'
## Warning: Coercing text to numeric in E5442 / R5442C5: '1'
## Warning: Coercing text to numeric in E5443 / R5443C5: '1'
## Warning: Coercing text to numeric in E5444 / R5444C5: '1'
## Warning: Coercing text to numeric in E5445 / R5445C5: '1'
## Warning: Coercing text to numeric in E5446 / R5446C5: '1'
## Warning: Coercing text to numeric in E5447 / R5447C5: '1'
## Warning: Coercing text to numeric in E5448 / R5448C5: '1'
## Warning: Coercing text to numeric in E5449 / R5449C5: '1'
## Warning: Coercing text to numeric in E5450 / R5450C5: '2'
## Warning: Coercing text to numeric in E5451 / R5451C5: '2'
## Warning: Coercing text to numeric in E5452 / R5452C5: '2'
## Warning: Coercing text to numeric in E5453 / R5453C5: '2'
## Warning: Coercing text to numeric in E5454 / R5454C5: '2'
## Warning: Coercing text to numeric in E5455 / R5455C5: '2'
## Warning: Coercing text to numeric in E5456 / R5456C5: '2'
## Warning: Coercing text to numeric in E5457 / R5457C5: '2'
## Warning: Coercing text to numeric in E5458 / R5458C5: '2'
## Warning: Coercing text to numeric in E5459 / R5459C5: '2'
## Warning: Coercing text to numeric in E5460 / R5460C5: '2'
## Warning: Coercing text to numeric in E5461 / R5461C5: '2'
## Warning: Coercing text to numeric in E5462 / R5462C5: '1'
## Warning: Coercing text to numeric in E5463 / R5463C5: '1'
## Warning: Coercing text to numeric in E5464 / R5464C5: '1'
## Warning: Coercing text to numeric in E5465 / R5465C5: '1'
## Warning: Coercing text to numeric in E5466 / R5466C5: '1'
## Warning: Coercing text to numeric in E5467 / R5467C5: '1'
## Warning: Coercing text to numeric in E5468 / R5468C5: '1'
## Warning: Coercing text to numeric in E5469 / R5469C5: '1'
## Warning: Coercing text to numeric in E5470 / R5470C5: '1'
## Warning: Coercing text to numeric in E5471 / R5471C5: '1'
## Warning: Coercing text to numeric in E5472 / R5472C5: '1'
## Warning: Coercing text to numeric in E5473 / R5473C5: '1'
## Warning: Coercing text to numeric in E5474 / R5474C5: '1'
## Warning: Coercing text to numeric in E5475 / R5475C5: '1'
## Warning: Coercing text to numeric in E5476 / R5476C5: '1'
## Warning: Coercing text to numeric in E5477 / R5477C5: '1'
## Warning: Coercing text to numeric in E5478 / R5478C5: '1'
## Warning: Coercing text to numeric in E5479 / R5479C5: '1'
## Warning: Coercing text to numeric in E5480 / R5480C5: '2'
## Warning: Coercing text to numeric in E5481 / R5481C5: '2'
## Warning: Coercing text to numeric in E5482 / R5482C5: '2'
## Warning: Coercing text to numeric in E5483 / R5483C5: '2'
## Warning: Coercing text to numeric in E5484 / R5484C5: '2'
## Warning: Coercing text to numeric in E5485 / R5485C5: '2'
## Warning: Coercing text to numeric in E5486 / R5486C5: '2'
## Warning: Coercing text to numeric in E5487 / R5487C5: '2'
## Warning: Coercing text to numeric in E5488 / R5488C5: '2'
## Warning: Coercing text to numeric in E5489 / R5489C5: '2'
## Warning: Coercing text to numeric in E5490 / R5490C5: '2'
## Warning: Coercing text to numeric in E5491 / R5491C5: '2'
## Warning: Coercing text to numeric in E5492 / R5492C5: '2'
## Warning: Coercing text to numeric in E5493 / R5493C5: '2'
## Warning: Coercing text to numeric in E5494 / R5494C5: '2'
## Warning: Coercing text to numeric in E5495 / R5495C5: '2'
## Warning: Coercing text to numeric in E5496 / R5496C5: '2'
## Warning: Coercing text to numeric in E5497 / R5497C5: '2'
## Warning: Coercing text to numeric in E5498 / R5498C5: '2'
## Warning: Coercing text to numeric in E5499 / R5499C5: '2'
## Warning: Coercing text to numeric in E5500 / R5500C5: '2'
## Warning: Coercing text to numeric in E5501 / R5501C5: '2'
## Warning: Coercing text to numeric in E5502 / R5502C5: '2'
## Warning: Coercing text to numeric in E5503 / R5503C5: '2'
## Warning: Coercing text to numeric in E5504 / R5504C5: '2'
## Warning: Coercing text to numeric in E5505 / R5505C5: '2'
## Warning: Coercing text to numeric in E5506 / R5506C5: '2'
## Warning: Coercing text to numeric in E5507 / R5507C5: '2'
## Warning: Coercing text to numeric in E5508 / R5508C5: '2'
## Warning: Coercing text to numeric in E5509 / R5509C5: '2'
## Warning: Coercing text to numeric in E5510 / R5510C5: '1'
## Warning: Coercing text to numeric in E5511 / R5511C5: '1'
## Warning: Coercing text to numeric in E5512 / R5512C5: '1'
## Warning: Coercing text to numeric in E5513 / R5513C5: '1'
## Warning: Coercing text to numeric in E5514 / R5514C5: '1'
## Warning: Coercing text to numeric in E5515 / R5515C5: '1'
## Warning: Coercing text to numeric in E5516 / R5516C5: '1'
## Warning: Coercing text to numeric in E5517 / R5517C5: '1'
## Warning: Coercing text to numeric in E5518 / R5518C5: '1'
## Warning: Coercing text to numeric in E5519 / R5519C5: '1'
## Warning: Coercing text to numeric in E5520 / R5520C5: '1'
## Warning: Coercing text to numeric in E5521 / R5521C5: '1'
## Warning: Coercing text to numeric in E5522 / R5522C5: '2'
## Warning: Coercing text to numeric in E5523 / R5523C5: '2'
## Warning: Coercing text to numeric in E5524 / R5524C5: '2'
## Warning: Coercing text to numeric in E5525 / R5525C5: '2'
## Warning: Coercing text to numeric in E5526 / R5526C5: '2'
## Warning: Coercing text to numeric in E5527 / R5527C5: '2'
## Warning: Coercing text to numeric in E5528 / R5528C5: '2'
## Warning: Coercing text to numeric in E5529 / R5529C5: '2'
## Warning: Coercing text to numeric in E5530 / R5530C5: '2'
## Warning: Coercing text to numeric in E5531 / R5531C5: '2'
## Warning: Coercing text to numeric in E5532 / R5532C5: '2'
## Warning: Coercing text to numeric in E5533 / R5533C5: '2'
## Warning: Coercing text to numeric in E5534 / R5534C5: '1'
## Warning: Coercing text to numeric in E5535 / R5535C5: '1'
## Warning: Coercing text to numeric in E5536 / R5536C5: '1'
## Warning: Coercing text to numeric in E5537 / R5537C5: '1'
## Warning: Coercing text to numeric in E5538 / R5538C5: '1'
## Warning: Coercing text to numeric in E5539 / R5539C5: '1'
## Warning: Coercing text to numeric in E5540 / R5540C5: '1'
## Warning: Coercing text to numeric in E5541 / R5541C5: '1'
## Warning: Coercing text to numeric in E5542 / R5542C5: '1'
## Warning: Coercing text to numeric in E5543 / R5543C5: '1'
## Warning: Coercing text to numeric in E5544 / R5544C5: '1'
## Warning: Coercing text to numeric in E5545 / R5545C5: '1'
## Warning: Coercing text to numeric in E5546 / R5546C5: '1'
## Warning: Coercing text to numeric in E5547 / R5547C5: '1'
## Warning: Coercing text to numeric in E5548 / R5548C5: '1'
## Warning: Coercing text to numeric in E5549 / R5549C5: '1'
## Warning: Coercing text to numeric in E5550 / R5550C5: '1'
## Warning: Coercing text to numeric in E5551 / R5551C5: '1'
## Warning: Coercing text to numeric in E5552 / R5552C5: '2'
## Warning: Coercing text to numeric in E5553 / R5553C5: '2'
## Warning: Coercing text to numeric in E5554 / R5554C5: '2'
## Warning: Coercing text to numeric in E5555 / R5555C5: '2'
## Warning: Coercing text to numeric in E5556 / R5556C5: '2'
## Warning: Coercing text to numeric in E5557 / R5557C5: '2'
## Warning: Coercing text to numeric in E5558 / R5558C5: '1'
## Warning: Coercing text to numeric in E5559 / R5559C5: '1'
## Warning: Coercing text to numeric in E5560 / R5560C5: '1'
## Warning: Coercing text to numeric in E5561 / R5561C5: '1'
## Warning: Coercing text to numeric in E5562 / R5562C5: '1'
## Warning: Coercing text to numeric in E5563 / R5563C5: '1'
## Warning: Coercing text to numeric in E5564 / R5564C5: '1'
## Warning: Coercing text to numeric in E5565 / R5565C5: '1'
## Warning: Coercing text to numeric in E5566 / R5566C5: '1'
## Warning: Coercing text to numeric in E5567 / R5567C5: '1'
## Warning: Coercing text to numeric in E5568 / R5568C5: '1'
## Warning: Coercing text to numeric in E5569 / R5569C5: '1'
## Warning: Coercing text to numeric in E5570 / R5570C5: '1'
## Warning: Coercing text to numeric in E5571 / R5571C5: '1'
## Warning: Coercing text to numeric in E5572 / R5572C5: '1'
## Warning: Coercing text to numeric in E5573 / R5573C5: '1'
## Warning: Coercing text to numeric in E5574 / R5574C5: '1'
## Warning: Coercing text to numeric in E5575 / R5575C5: '1'
## Warning: Coercing text to numeric in E5576 / R5576C5: '1'
## Warning: Coercing text to numeric in E5577 / R5577C5: '1'
## Warning: Coercing text to numeric in E5578 / R5578C5: '1'
## Warning: Coercing text to numeric in E5579 / R5579C5: '1'
## Warning: Coercing text to numeric in E5580 / R5580C5: '1'
## Warning: Coercing text to numeric in E5581 / R5581C5: '1'
## Warning: Coercing text to numeric in E5582 / R5582C5: '1'
## Warning: Coercing text to numeric in E5583 / R5583C5: '1'
## Warning: Coercing text to numeric in E5584 / R5584C5: '1'
## Warning: Coercing text to numeric in E5585 / R5585C5: '1'
## Warning: Coercing text to numeric in E5586 / R5586C5: '1'
## Warning: Coercing text to numeric in E5587 / R5587C5: '1'
## Warning: Coercing text to numeric in E5588 / R5588C5: '1'
## Warning: Coercing text to numeric in E5589 / R5589C5: '1'
## Warning: Coercing text to numeric in E5590 / R5590C5: '1'
## Warning: Coercing text to numeric in E5591 / R5591C5: '1'
## Warning: Coercing text to numeric in E5592 / R5592C5: '1'
## Warning: Coercing text to numeric in E5593 / R5593C5: '1'
## Warning: Coercing text to numeric in E5594 / R5594C5: '2'
## Warning: Coercing text to numeric in E5595 / R5595C5: '2'
## Warning: Coercing text to numeric in E5596 / R5596C5: '2'
## Warning: Coercing text to numeric in E5597 / R5597C5: '2'
## Warning: Coercing text to numeric in E5598 / R5598C5: '2'
## Warning: Coercing text to numeric in E5599 / R5599C5: '2'
## Warning: Coercing text to numeric in E5600 / R5600C5: '2'
## Warning: Coercing text to numeric in E5601 / R5601C5: '2'
## Warning: Coercing text to numeric in E5602 / R5602C5: '2'
## Warning: Coercing text to numeric in E5603 / R5603C5: '2'
## Warning: Coercing text to numeric in E5604 / R5604C5: '2'
## Warning: Coercing text to numeric in E5605 / R5605C5: '2'
## Warning: Coercing text to numeric in E5606 / R5606C5: '2'
## Warning: Coercing text to numeric in E5607 / R5607C5: '2'
## Warning: Coercing text to numeric in E5608 / R5608C5: '2'
## Warning: Coercing text to numeric in E5609 / R5609C5: '2'
## Warning: Coercing text to numeric in E5610 / R5610C5: '2'
## Warning: Coercing text to numeric in E5611 / R5611C5: '2'
## Warning: Coercing text to numeric in E5612 / R5612C5: '2'
## Warning: Coercing text to numeric in E5613 / R5613C5: '2'
## Warning: Coercing text to numeric in E5614 / R5614C5: '2'
## Warning: Coercing text to numeric in E5615 / R5615C5: '2'
## Warning: Coercing text to numeric in E5616 / R5616C5: '2'
## Warning: Coercing text to numeric in E5617 / R5617C5: '2'
## Warning: Coercing text to numeric in E5618 / R5618C5: '1'
## Warning: Coercing text to numeric in E5619 / R5619C5: '1'
## Warning: Coercing text to numeric in E5620 / R5620C5: '1'
## Warning: Coercing text to numeric in E5621 / R5621C5: '1'
## Warning: Coercing text to numeric in E5622 / R5622C5: '1'
## Warning: Coercing text to numeric in E5623 / R5623C5: '1'
## Warning: Coercing text to numeric in E5624 / R5624C5: '2'
## Warning: Coercing text to numeric in E5625 / R5625C5: '2'
## Warning: Coercing text to numeric in E5626 / R5626C5: '2'
## Warning: Coercing text to numeric in E5627 / R5627C5: '2'
## Warning: Coercing text to numeric in E5628 / R5628C5: '2'
## Warning: Coercing text to numeric in E5629 / R5629C5: '2'
## Warning: Coercing text to numeric in E5630 / R5630C5: '2'
## Warning: Coercing text to numeric in E5631 / R5631C5: '2'
## Warning: Coercing text to numeric in E5632 / R5632C5: '2'
## Warning: Coercing text to numeric in E5633 / R5633C5: '2'
## Warning: Coercing text to numeric in E5634 / R5634C5: '2'
## Warning: Coercing text to numeric in E5635 / R5635C5: '2'
## Warning: Coercing text to numeric in E5636 / R5636C5: '1'
## Warning: Coercing text to numeric in E5637 / R5637C5: '1'
## Warning: Coercing text to numeric in E5638 / R5638C5: '1'
## Warning: Coercing text to numeric in E5639 / R5639C5: '1'
## Warning: Coercing text to numeric in E5640 / R5640C5: '1'
## Warning: Coercing text to numeric in E5641 / R5641C5: '1'
## Warning: Coercing text to numeric in E5642 / R5642C5: '2'
## Warning: Coercing text to numeric in E5643 / R5643C5: '2'
## Warning: Coercing text to numeric in E5644 / R5644C5: '2'
## Warning: Coercing text to numeric in E5645 / R5645C5: '2'
## Warning: Coercing text to numeric in E5646 / R5646C5: '2'
## Warning: Coercing text to numeric in E5647 / R5647C5: '2'
## Warning: Coercing text to numeric in E5648 / R5648C5: '1'
## Warning: Coercing text to numeric in E5649 / R5649C5: '1'
## Warning: Coercing text to numeric in E5650 / R5650C5: '1'
## Warning: Coercing text to numeric in E5651 / R5651C5: '1'
## Warning: Coercing text to numeric in E5652 / R5652C5: '1'
## Warning: Coercing text to numeric in E5653 / R5653C5: '1'
## Warning: Coercing text to numeric in E5654 / R5654C5: '2'
## Warning: Coercing text to numeric in E5655 / R5655C5: '2'
## Warning: Coercing text to numeric in E5656 / R5656C5: '2'
## Warning: Coercing text to numeric in E5657 / R5657C5: '2'
## Warning: Coercing text to numeric in E5658 / R5658C5: '2'
## Warning: Coercing text to numeric in E5659 / R5659C5: '2'
## Warning: Coercing text to numeric in E5660 / R5660C5: '1'
## Warning: Coercing text to numeric in E5661 / R5661C5: '1'
## Warning: Coercing text to numeric in E5662 / R5662C5: '1'
## Warning: Coercing text to numeric in E5663 / R5663C5: '1'
## Warning: Coercing text to numeric in E5664 / R5664C5: '1'
## Warning: Coercing text to numeric in E5665 / R5665C5: '1'
## Warning: Coercing text to numeric in E5666 / R5666C5: '2'
## Warning: Coercing text to numeric in E5667 / R5667C5: '2'
## Warning: Coercing text to numeric in E5668 / R5668C5: '2'
## Warning: Coercing text to numeric in E5669 / R5669C5: '2'
## Warning: Coercing text to numeric in E5670 / R5670C5: '2'
## Warning: Coercing text to numeric in E5671 / R5671C5: '2'
## Warning: Coercing text to numeric in E5672 / R5672C5: '1'
## Warning: Coercing text to numeric in E5673 / R5673C5: '1'
## Warning: Coercing text to numeric in E5674 / R5674C5: '1'
## Warning: Coercing text to numeric in E5675 / R5675C5: '1'
## Warning: Coercing text to numeric in E5676 / R5676C5: '1'
## Warning: Coercing text to numeric in E5677 / R5677C5: '1'
## Warning: Coercing text to numeric in E5678 / R5678C5: '1'
## Warning: Coercing text to numeric in E5679 / R5679C5: '1'
## Warning: Coercing text to numeric in E5680 / R5680C5: '1'
## Warning: Coercing text to numeric in E5681 / R5681C5: '1'
## Warning: Coercing text to numeric in E5682 / R5682C5: '1'
## Warning: Coercing text to numeric in E5683 / R5683C5: '1'
## Warning: Coercing text to numeric in E5684 / R5684C5: '2'
## Warning: Coercing text to numeric in E5685 / R5685C5: '2'
## Warning: Coercing text to numeric in E5686 / R5686C5: '2'
## Warning: Coercing text to numeric in E5687 / R5687C5: '2'
## Warning: Coercing text to numeric in E5688 / R5688C5: '2'
## Warning: Coercing text to numeric in E5689 / R5689C5: '2'
## Warning: Coercing text to numeric in E5690 / R5690C5: '2'
## Warning: Coercing text to numeric in E5691 / R5691C5: '2'
## Warning: Coercing text to numeric in E5692 / R5692C5: '2'
## Warning: Coercing text to numeric in E5693 / R5693C5: '2'
## Warning: Coercing text to numeric in E5694 / R5694C5: '2'
## Warning: Coercing text to numeric in E5695 / R5695C5: '2'
## Warning: Coercing text to numeric in E5696 / R5696C5: '2'
## Warning: Coercing text to numeric in E5697 / R5697C5: '2'
## Warning: Coercing text to numeric in E5698 / R5698C5: '2'
## Warning: Coercing text to numeric in E5699 / R5699C5: '2'
## Warning: Coercing text to numeric in E5700 / R5700C5: '2'
## Warning: Coercing text to numeric in E5701 / R5701C5: '2'
## Warning: Coercing text to numeric in E5702 / R5702C5: '1'
## Warning: Coercing text to numeric in E5703 / R5703C5: '1'
## Warning: Coercing text to numeric in E5704 / R5704C5: '1'
## Warning: Coercing text to numeric in E5705 / R5705C5: '1'
## Warning: Coercing text to numeric in E5706 / R5706C5: '1'
## Warning: Coercing text to numeric in E5707 / R5707C5: '1'
## Warning: Coercing text to numeric in E5708 / R5708C5: '1'
## Warning: Coercing text to numeric in E5709 / R5709C5: '1'
## Warning: Coercing text to numeric in E5710 / R5710C5: '1'
## Warning: Coercing text to numeric in E5711 / R5711C5: '1'
## Warning: Coercing text to numeric in E5712 / R5712C5: '1'
## Warning: Coercing text to numeric in E5713 / R5713C5: '1'
## Warning: Coercing text to numeric in E5714 / R5714C5: '1'
## Warning: Coercing text to numeric in E5715 / R5715C5: '1'
## Warning: Coercing text to numeric in E5716 / R5716C5: '1'
## Warning: Coercing text to numeric in E5717 / R5717C5: '1'
## Warning: Coercing text to numeric in E5718 / R5718C5: '1'
## Warning: Coercing text to numeric in E5719 / R5719C5: '1'
## Warning: Coercing text to numeric in E5720 / R5720C5: '2'
## Warning: Coercing text to numeric in E5721 / R5721C5: '2'
## Warning: Coercing text to numeric in E5722 / R5722C5: '2'
## Warning: Coercing text to numeric in E5723 / R5723C5: '2'
## Warning: Coercing text to numeric in E5724 / R5724C5: '2'
## Warning: Coercing text to numeric in E5725 / R5725C5: '2'
## Warning: Coercing text to numeric in E5726 / R5726C5: '1'
## Warning: Coercing text to numeric in E5727 / R5727C5: '1'
## Warning: Coercing text to numeric in E5728 / R5728C5: '1'
## Warning: Coercing text to numeric in E5729 / R5729C5: '1'
## Warning: Coercing text to numeric in E5730 / R5730C5: '1'
## Warning: Coercing text to numeric in E5731 / R5731C5: '1'
## Warning: Coercing text to numeric in E5732 / R5732C5: '2'
## Warning: Coercing text to numeric in E5733 / R5733C5: '2'
## Warning: Coercing text to numeric in E5734 / R5734C5: '2'
## Warning: Coercing text to numeric in E5735 / R5735C5: '2'
## Warning: Coercing text to numeric in E5736 / R5736C5: '2'
## Warning: Coercing text to numeric in E5737 / R5737C5: '2'
## Warning: Coercing text to numeric in E5738 / R5738C5: '1'
## Warning: Coercing text to numeric in E5739 / R5739C5: '1'
## Warning: Coercing text to numeric in E5740 / R5740C5: '1'
## Warning: Coercing text to numeric in E5741 / R5741C5: '1'
## Warning: Coercing text to numeric in E5742 / R5742C5: '1'
## Warning: Coercing text to numeric in E5743 / R5743C5: '1'
## Warning: Coercing text to numeric in E5744 / R5744C5: '2'
## Warning: Coercing text to numeric in E5745 / R5745C5: '2'
## Warning: Coercing text to numeric in E5746 / R5746C5: '2'
## Warning: Coercing text to numeric in E5747 / R5747C5: '2'
## Warning: Coercing text to numeric in E5748 / R5748C5: '2'
## Warning: Coercing text to numeric in E5749 / R5749C5: '2'
## Warning: Coercing text to numeric in E5750 / R5750C5: '2'
## Warning: Coercing text to numeric in E5751 / R5751C5: '2'
## Warning: Coercing text to numeric in E5752 / R5752C5: '2'
## Warning: Coercing text to numeric in E5753 / R5753C5: '2'
## Warning: Coercing text to numeric in E5754 / R5754C5: '2'
## Warning: Coercing text to numeric in E5755 / R5755C5: '2'
## Warning: Coercing text to numeric in E5756 / R5756C5: '1'
## Warning: Coercing text to numeric in E5757 / R5757C5: '1'
## Warning: Coercing text to numeric in E5758 / R5758C5: '1'
## Warning: Coercing text to numeric in E5759 / R5759C5: '1'
## Warning: Coercing text to numeric in E5760 / R5760C5: '1'
## Warning: Coercing text to numeric in E5761 / R5761C5: '1'
## Warning: Coercing text to numeric in E5762 / R5762C5: '1'
## Warning: Coercing text to numeric in E5763 / R5763C5: '1'
## Warning: Coercing text to numeric in E5764 / R5764C5: '1'
## Warning: Coercing text to numeric in E5765 / R5765C5: '1'
## Warning: Coercing text to numeric in E5766 / R5766C5: '1'
## Warning: Coercing text to numeric in E5767 / R5767C5: '1'
## Warning: Coercing text to numeric in E5768 / R5768C5: '1'
## Warning: Coercing text to numeric in E5769 / R5769C5: '1'
## Warning: Coercing text to numeric in E5770 / R5770C5: '1'
## Warning: Coercing text to numeric in E5771 / R5771C5: '1'
## Warning: Coercing text to numeric in E5772 / R5772C5: '1'
## Warning: Coercing text to numeric in E5773 / R5773C5: '1'
## Warning: Coercing text to numeric in E5774 / R5774C5: '1'
## Warning: Coercing text to numeric in E5775 / R5775C5: '1'
## Warning: Coercing text to numeric in E5776 / R5776C5: '1'
## Warning: Coercing text to numeric in E5777 / R5777C5: '1'
## Warning: Coercing text to numeric in E5778 / R5778C5: '1'
## Warning: Coercing text to numeric in E5779 / R5779C5: '1'
## Warning: Coercing text to numeric in E5780 / R5780C5: '1'
## Warning: Coercing text to numeric in E5781 / R5781C5: '1'
## Warning: Coercing text to numeric in E5782 / R5782C5: '1'
## Warning: Coercing text to numeric in E5783 / R5783C5: '1'
## Warning: Coercing text to numeric in E5784 / R5784C5: '1'
## Warning: Coercing text to numeric in E5785 / R5785C5: '1'
## Warning: Coercing text to numeric in E5786 / R5786C5: '2'
## Warning: Coercing text to numeric in E5787 / R5787C5: '2'
## Warning: Coercing text to numeric in E5788 / R5788C5: '2'
## Warning: Coercing text to numeric in E5789 / R5789C5: '2'
## Warning: Coercing text to numeric in E5790 / R5790C5: '2'
## Warning: Coercing text to numeric in E5791 / R5791C5: '2'
## Warning: Coercing text to numeric in E5792 / R5792C5: '1'
## Warning: Coercing text to numeric in E5793 / R5793C5: '1'
## Warning: Coercing text to numeric in E5794 / R5794C5: '1'
## Warning: Coercing text to numeric in E5795 / R5795C5: '1'
## Warning: Coercing text to numeric in E5796 / R5796C5: '1'
## Warning: Coercing text to numeric in E5797 / R5797C5: '1'
## Warning: Coercing text to numeric in E5798 / R5798C5: '1'
## Warning: Coercing text to numeric in E5799 / R5799C5: '1'
## Warning: Coercing text to numeric in E5800 / R5800C5: '1'
## Warning: Coercing text to numeric in E5801 / R5801C5: '1'
## Warning: Coercing text to numeric in E5802 / R5802C5: '1'
## Warning: Coercing text to numeric in E5803 / R5803C5: '1'
## Warning: Coercing text to numeric in E5804 / R5804C5: '1'
## Warning: Coercing text to numeric in E5805 / R5805C5: '1'
## Warning: Coercing text to numeric in E5806 / R5806C5: '1'
## Warning: Coercing text to numeric in E5807 / R5807C5: '1'
## Warning: Coercing text to numeric in E5808 / R5808C5: '1'
## Warning: Coercing text to numeric in E5809 / R5809C5: '1'
## Warning: Coercing text to numeric in E5810 / R5810C5: '1'
## Warning: Coercing text to numeric in E5811 / R5811C5: '1'
## Warning: Coercing text to numeric in E5812 / R5812C5: '1'
## Warning: Coercing text to numeric in E5813 / R5813C5: '1'
## Warning: Coercing text to numeric in E5814 / R5814C5: '1'
## Warning: Coercing text to numeric in E5815 / R5815C5: '1'
## Warning: Coercing text to numeric in E5816 / R5816C5: '2'
## Warning: Coercing text to numeric in E5817 / R5817C5: '2'
## Warning: Coercing text to numeric in E5818 / R5818C5: '2'
## Warning: Coercing text to numeric in E5819 / R5819C5: '2'
## Warning: Coercing text to numeric in E5820 / R5820C5: '2'
## Warning: Coercing text to numeric in E5821 / R5821C5: '2'
## Warning: Coercing text to numeric in E5822 / R5822C5: '1'
## Warning: Coercing text to numeric in E5823 / R5823C5: '1'
## Warning: Coercing text to numeric in E5824 / R5824C5: '1'
## Warning: Coercing text to numeric in E5825 / R5825C5: '1'
## Warning: Coercing text to numeric in E5826 / R5826C5: '1'
## Warning: Coercing text to numeric in E5827 / R5827C5: '1'
## Warning: Coercing text to numeric in E5828 / R5828C5: '1'
## Warning: Coercing text to numeric in E5829 / R5829C5: '1'
## Warning: Coercing text to numeric in E5830 / R5830C5: '1'
## Warning: Coercing text to numeric in E5831 / R5831C5: '1'
## Warning: Coercing text to numeric in E5832 / R5832C5: '1'
## Warning: Coercing text to numeric in E5833 / R5833C5: '1'
## Warning: Coercing text to numeric in E5834 / R5834C5: '2'
## Warning: Coercing text to numeric in E5835 / R5835C5: '2'
## Warning: Coercing text to numeric in E5836 / R5836C5: '2'
## Warning: Coercing text to numeric in E5837 / R5837C5: '2'
## Warning: Coercing text to numeric in E5838 / R5838C5: '2'
## Warning: Coercing text to numeric in E5839 / R5839C5: '2'
## Warning: Coercing text to numeric in E5840 / R5840C5: '2'
## Warning: Coercing text to numeric in E5841 / R5841C5: '2'
## Warning: Coercing text to numeric in E5842 / R5842C5: '2'
## Warning: Coercing text to numeric in E5843 / R5843C5: '2'
## Warning: Coercing text to numeric in E5844 / R5844C5: '2'
## Warning: Coercing text to numeric in E5845 / R5845C5: '2'
## Warning: Coercing text to numeric in E5846 / R5846C5: '2'
## Warning: Coercing text to numeric in E5847 / R5847C5: '2'
## Warning: Coercing text to numeric in E5848 / R5848C5: '2'
## Warning: Coercing text to numeric in E5849 / R5849C5: '2'
## Warning: Coercing text to numeric in E5850 / R5850C5: '2'
## Warning: Coercing text to numeric in E5851 / R5851C5: '2'
## Warning: Coercing text to numeric in E5852 / R5852C5: '2'
## Warning: Coercing text to numeric in E5853 / R5853C5: '2'
## Warning: Coercing text to numeric in E5854 / R5854C5: '2'
## Warning: Coercing text to numeric in E5855 / R5855C5: '2'
## Warning: Coercing text to numeric in E5856 / R5856C5: '2'
## Warning: Coercing text to numeric in E5857 / R5857C5: '2'
## Warning: Coercing text to numeric in E5858 / R5858C5: '2'
## Warning: Coercing text to numeric in E5859 / R5859C5: '2'
## Warning: Coercing text to numeric in E5860 / R5860C5: '2'
## Warning: Coercing text to numeric in E5861 / R5861C5: '2'
## Warning: Coercing text to numeric in E5862 / R5862C5: '2'
## Warning: Coercing text to numeric in E5863 / R5863C5: '2'
## Warning: Coercing text to numeric in E5864 / R5864C5: '1'
## Warning: Coercing text to numeric in E5865 / R5865C5: '1'
## Warning: Coercing text to numeric in E5866 / R5866C5: '1'
## Warning: Coercing text to numeric in E5867 / R5867C5: '1'
## Warning: Coercing text to numeric in E5868 / R5868C5: '1'
## Warning: Coercing text to numeric in E5869 / R5869C5: '1'
## Warning: Coercing text to numeric in E5870 / R5870C5: '2'
## Warning: Coercing text to numeric in E5871 / R5871C5: '2'
## Warning: Coercing text to numeric in E5872 / R5872C5: '2'
## Warning: Coercing text to numeric in E5873 / R5873C5: '2'
## Warning: Coercing text to numeric in E5874 / R5874C5: '2'
## Warning: Coercing text to numeric in E5875 / R5875C5: '2'
## Warning: Coercing text to numeric in E5876 / R5876C5: '1'
## Warning: Coercing text to numeric in E5877 / R5877C5: '1'
## Warning: Coercing text to numeric in E5878 / R5878C5: '1'
## Warning: Coercing text to numeric in E5879 / R5879C5: '1'
## Warning: Coercing text to numeric in E5880 / R5880C5: '1'
## Warning: Coercing text to numeric in E5881 / R5881C5: '1'
## Warning: Coercing text to numeric in E5882 / R5882C5: '1'
## Warning: Coercing text to numeric in E5883 / R5883C5: '1'
## Warning: Coercing text to numeric in E5884 / R5884C5: '1'
## Warning: Coercing text to numeric in E5885 / R5885C5: '1'
## Warning: Coercing text to numeric in E5886 / R5886C5: '1'
## Warning: Coercing text to numeric in E5887 / R5887C5: '1'
## Warning: Coercing text to numeric in E5888 / R5888C5: '2'
## Warning: Coercing text to numeric in E5889 / R5889C5: '2'
## Warning: Coercing text to numeric in E5890 / R5890C5: '2'
## Warning: Coercing text to numeric in E5891 / R5891C5: '2'
## Warning: Coercing text to numeric in E5892 / R5892C5: '2'
## Warning: Coercing text to numeric in E5893 / R5893C5: '2'
## Warning: Coercing text to numeric in E5894 / R5894C5: '2'
## Warning: Coercing text to numeric in E5895 / R5895C5: '2'
## Warning: Coercing text to numeric in E5896 / R5896C5: '2'
## Warning: Coercing text to numeric in E5897 / R5897C5: '2'
## Warning: Coercing text to numeric in E5898 / R5898C5: '2'
## Warning: Coercing text to numeric in E5899 / R5899C5: '2'
## Warning: Coercing text to numeric in E5900 / R5900C5: '1'
## Warning: Coercing text to numeric in E5901 / R5901C5: '1'
## Warning: Coercing text to numeric in E5902 / R5902C5: '1'
## Warning: Coercing text to numeric in E5903 / R5903C5: '1'
## Warning: Coercing text to numeric in E5904 / R5904C5: '1'
## Warning: Coercing text to numeric in E5905 / R5905C5: '1'
## Warning: Coercing text to numeric in E5906 / R5906C5: '2'
## Warning: Coercing text to numeric in E5907 / R5907C5: '2'
## Warning: Coercing text to numeric in E5908 / R5908C5: '2'
## Warning: Coercing text to numeric in E5909 / R5909C5: '2'
## Warning: Coercing text to numeric in E5910 / R5910C5: '2'
## Warning: Coercing text to numeric in E5911 / R5911C5: '2'
## Warning: Coercing text to numeric in E5912 / R5912C5: '2'
## Warning: Coercing text to numeric in E5913 / R5913C5: '2'
## Warning: Coercing text to numeric in E5914 / R5914C5: '2'
## Warning: Coercing text to numeric in E5915 / R5915C5: '2'
## Warning: Coercing text to numeric in E5916 / R5916C5: '2'
## Warning: Coercing text to numeric in E5917 / R5917C5: '2'
## Warning: Coercing text to numeric in E5918 / R5918C5: '1'
## Warning: Coercing text to numeric in E5919 / R5919C5: '1'
## Warning: Coercing text to numeric in E5920 / R5920C5: '1'
## Warning: Coercing text to numeric in E5921 / R5921C5: '1'
## Warning: Coercing text to numeric in E5922 / R5922C5: '1'
## Warning: Coercing text to numeric in E5923 / R5923C5: '1'
## Warning: Coercing text to numeric in E5924 / R5924C5: '2'
## Warning: Coercing text to numeric in E5925 / R5925C5: '2'
## Warning: Coercing text to numeric in E5926 / R5926C5: '2'
## Warning: Coercing text to numeric in E5927 / R5927C5: '2'
## Warning: Coercing text to numeric in E5928 / R5928C5: '2'
## Warning: Coercing text to numeric in E5929 / R5929C5: '2'
## Warning: Coercing text to numeric in E5930 / R5930C5: '2'
## Warning: Coercing text to numeric in E5931 / R5931C5: '2'
## Warning: Coercing text to numeric in E5932 / R5932C5: '2'
## Warning: Coercing text to numeric in E5933 / R5933C5: '2'
## Warning: Coercing text to numeric in E5934 / R5934C5: '2'
## Warning: Coercing text to numeric in E5935 / R5935C5: '2'
## Warning: Coercing text to numeric in E5936 / R5936C5: '2'
## Warning: Coercing text to numeric in E5937 / R5937C5: '2'
## Warning: Coercing text to numeric in E5938 / R5938C5: '2'
## Warning: Coercing text to numeric in E5939 / R5939C5: '2'
## Warning: Coercing text to numeric in E5940 / R5940C5: '2'
## Warning: Coercing text to numeric in E5941 / R5941C5: '2'
## Warning: Coercing text to numeric in E5942 / R5942C5: '2'
## Warning: Coercing text to numeric in E5943 / R5943C5: '2'
## Warning: Coercing text to numeric in E5944 / R5944C5: '2'
## Warning: Coercing text to numeric in E5945 / R5945C5: '2'
## Warning: Coercing text to numeric in E5946 / R5946C5: '2'
## Warning: Coercing text to numeric in E5947 / R5947C5: '2'
## Warning: Coercing text to numeric in E5948 / R5948C5: '2'
## Warning: Coercing text to numeric in E5949 / R5949C5: '2'
## Warning: Coercing text to numeric in E5950 / R5950C5: '2'
## Warning: Coercing text to numeric in E5951 / R5951C5: '2'
## Warning: Coercing text to numeric in E5952 / R5952C5: '2'
## Warning: Coercing text to numeric in E5953 / R5953C5: '2'
## Warning: Coercing text to numeric in E5954 / R5954C5: '2'
## Warning: Coercing text to numeric in E5955 / R5955C5: '2'
## Warning: Coercing text to numeric in E5956 / R5956C5: '2'
## Warning: Coercing text to numeric in E5957 / R5957C5: '2'
## Warning: Coercing text to numeric in E5958 / R5958C5: '2'
## Warning: Coercing text to numeric in E5959 / R5959C5: '2'
## Warning: Coercing text to numeric in E5960 / R5960C5: '2'
## Warning: Coercing text to numeric in E5961 / R5961C5: '2'
## Warning: Coercing text to numeric in E5962 / R5962C5: '2'
## Warning: Coercing text to numeric in E5963 / R5963C5: '2'
## Warning: Coercing text to numeric in E5964 / R5964C5: '2'
## Warning: Coercing text to numeric in E5965 / R5965C5: '2'
## Warning: Coercing text to numeric in E5966 / R5966C5: '1'
## Warning: Coercing text to numeric in E5967 / R5967C5: '1'
## Warning: Coercing text to numeric in E5968 / R5968C5: '1'
## Warning: Coercing text to numeric in E5969 / R5969C5: '1'
## Warning: Coercing text to numeric in E5970 / R5970C5: '1'
## Warning: Coercing text to numeric in E5971 / R5971C5: '1'
## Warning: Coercing text to numeric in E5972 / R5972C5: '1'
## Warning: Coercing text to numeric in E5973 / R5973C5: '1'
## Warning: Coercing text to numeric in E5974 / R5974C5: '1'
## Warning: Coercing text to numeric in E5975 / R5975C5: '1'
## Warning: Coercing text to numeric in E5976 / R5976C5: '1'
## Warning: Coercing text to numeric in E5977 / R5977C5: '1'
## Warning: Coercing text to numeric in E5978 / R5978C5: '1'
## Warning: Coercing text to numeric in E5979 / R5979C5: '1'
## Warning: Coercing text to numeric in E5980 / R5980C5: '1'
## Warning: Coercing text to numeric in E5981 / R5981C5: '1'
## Warning: Coercing text to numeric in E5982 / R5982C5: '1'
## Warning: Coercing text to numeric in E5983 / R5983C5: '1'
## Warning: Coercing text to numeric in E5984 / R5984C5: '2'
## Warning: Coercing text to numeric in E5985 / R5985C5: '2'
## Warning: Coercing text to numeric in E5986 / R5986C5: '2'
## Warning: Coercing text to numeric in E5987 / R5987C5: '2'
## Warning: Coercing text to numeric in E5988 / R5988C5: '2'
## Warning: Coercing text to numeric in E5989 / R5989C5: '2'
## Warning: Coercing text to numeric in E5990 / R5990C5: '1'
## Warning: Coercing text to numeric in E5991 / R5991C5: '1'
## Warning: Coercing text to numeric in E5992 / R5992C5: '1'
## Warning: Coercing text to numeric in E5993 / R5993C5: '1'
## Warning: Coercing text to numeric in E5994 / R5994C5: '1'
## Warning: Coercing text to numeric in E5995 / R5995C5: '1'
## Warning: Coercing text to numeric in E5996 / R5996C5: '1'
## Warning: Coercing text to numeric in E5997 / R5997C5: '1'
## Warning: Coercing text to numeric in E5998 / R5998C5: '1'
## Warning: Coercing text to numeric in E5999 / R5999C5: '1'
## Warning: Coercing text to numeric in E6000 / R6000C5: '1'
## Warning: Coercing text to numeric in E6001 / R6001C5: '1'
## Warning: Coercing text to numeric in E6002 / R6002C5: '2'
## Warning: Coercing text to numeric in E6003 / R6003C5: '2'
## Warning: Coercing text to numeric in E6004 / R6004C5: '2'
## Warning: Coercing text to numeric in E6005 / R6005C5: '2'
## Warning: Coercing text to numeric in E6006 / R6006C5: '2'
## Warning: Coercing text to numeric in E6007 / R6007C5: '2'
## Warning: Coercing text to numeric in E6008 / R6008C5: '2'
## Warning: Coercing text to numeric in E6009 / R6009C5: '2'
## Warning: Coercing text to numeric in E6010 / R6010C5: '2'
## Warning: Coercing text to numeric in E6011 / R6011C5: '2'
## Warning: Coercing text to numeric in E6012 / R6012C5: '2'
## Warning: Coercing text to numeric in E6013 / R6013C5: '2'
## Warning: Coercing text to numeric in E6014 / R6014C5: '1'
## Warning: Coercing text to numeric in E6015 / R6015C5: '1'
## Warning: Coercing text to numeric in E6016 / R6016C5: '1'
## Warning: Coercing text to numeric in E6017 / R6017C5: '1'
## Warning: Coercing text to numeric in E6018 / R6018C5: '1'
## Warning: Coercing text to numeric in E6019 / R6019C5: '1'
## Warning: Coercing text to numeric in E6020 / R6020C5: '1'
## Warning: Coercing text to numeric in E6021 / R6021C5: '1'
## Warning: Coercing text to numeric in E6022 / R6022C5: '1'
## Warning: Coercing text to numeric in E6023 / R6023C5: '1'
## Warning: Coercing text to numeric in E6024 / R6024C5: '1'
## Warning: Coercing text to numeric in E6025 / R6025C5: '1'
## Warning: Coercing text to numeric in E6026 / R6026C5: '1'
## Warning: Coercing text to numeric in E6027 / R6027C5: '1'
## Warning: Coercing text to numeric in E6028 / R6028C5: '1'
## Warning: Coercing text to numeric in E6029 / R6029C5: '1'
## Warning: Coercing text to numeric in E6030 / R6030C5: '1'
## Warning: Coercing text to numeric in E6031 / R6031C5: '1'
## Warning: Coercing text to numeric in E6032 / R6032C5: '1'
## Warning: Coercing text to numeric in E6033 / R6033C5: '1'
## Warning: Coercing text to numeric in E6034 / R6034C5: '1'
## Warning: Coercing text to numeric in E6035 / R6035C5: '1'
## Warning: Coercing text to numeric in E6036 / R6036C5: '1'
## Warning: Coercing text to numeric in E6037 / R6037C5: '1'
## Warning: Coercing text to numeric in E6038 / R6038C5: '2'
## Warning: Coercing text to numeric in E6039 / R6039C5: '2'
## Warning: Coercing text to numeric in E6040 / R6040C5: '2'
## Warning: Coercing text to numeric in E6041 / R6041C5: '2'
## Warning: Coercing text to numeric in E6042 / R6042C5: '2'
## Warning: Coercing text to numeric in E6043 / R6043C5: '2'
## Warning: Coercing text to numeric in E6044 / R6044C5: '2'
## Warning: Coercing text to numeric in E6045 / R6045C5: '2'
## Warning: Coercing text to numeric in E6046 / R6046C5: '2'
## Warning: Coercing text to numeric in E6047 / R6047C5: '2'
## Warning: Coercing text to numeric in E6048 / R6048C5: '2'
## Warning: Coercing text to numeric in E6049 / R6049C5: '2'
## Warning: Coercing text to numeric in E6050 / R6050C5: '2'
## Warning: Coercing text to numeric in E6051 / R6051C5: '2'
## Warning: Coercing text to numeric in E6052 / R6052C5: '2'
## Warning: Coercing text to numeric in E6053 / R6053C5: '2'
## Warning: Coercing text to numeric in E6054 / R6054C5: '2'
## Warning: Coercing text to numeric in E6055 / R6055C5: '2'
## Warning: Coercing text to numeric in E6056 / R6056C5: '1'
## Warning: Coercing text to numeric in E6057 / R6057C5: '1'
## Warning: Coercing text to numeric in E6058 / R6058C5: '1'
## Warning: Coercing text to numeric in E6059 / R6059C5: '1'
## Warning: Coercing text to numeric in E6060 / R6060C5: '1'
## Warning: Coercing text to numeric in E6061 / R6061C5: '1'
## Warning: Coercing text to numeric in E6062 / R6062C5: '1'
## Warning: Coercing text to numeric in E6063 / R6063C5: '1'
## Warning: Coercing text to numeric in E6064 / R6064C5: '1'
## Warning: Coercing text to numeric in E6065 / R6065C5: '1'
## Warning: Coercing text to numeric in E6066 / R6066C5: '1'
## Warning: Coercing text to numeric in E6067 / R6067C5: '1'
## Warning: Coercing text to numeric in E6068 / R6068C5: '1'
## Warning: Coercing text to numeric in E6069 / R6069C5: '1'
## Warning: Coercing text to numeric in E6070 / R6070C5: '1'
## Warning: Coercing text to numeric in E6071 / R6071C5: '1'
## Warning: Coercing text to numeric in E6072 / R6072C5: '1'
## Warning: Coercing text to numeric in E6073 / R6073C5: '1'
## Warning: Coercing text to numeric in E6074 / R6074C5: '2'
## Warning: Coercing text to numeric in E6075 / R6075C5: '2'
## Warning: Coercing text to numeric in E6076 / R6076C5: '2'
## Warning: Coercing text to numeric in E6077 / R6077C5: '2'
## Warning: Coercing text to numeric in E6078 / R6078C5: '2'
## Warning: Coercing text to numeric in E6079 / R6079C5: '2'
## Warning: Coercing text to numeric in E6080 / R6080C5: '1'
## Warning: Coercing text to numeric in E6081 / R6081C5: '1'
## Warning: Coercing text to numeric in E6082 / R6082C5: '1'
## Warning: Coercing text to numeric in E6083 / R6083C5: '1'
## Warning: Coercing text to numeric in E6084 / R6084C5: '1'
## Warning: Coercing text to numeric in E6085 / R6085C5: '1'
## Warning: Coercing text to numeric in E6086 / R6086C5: '1'
## Warning: Coercing text to numeric in E6087 / R6087C5: '1'
## Warning: Coercing text to numeric in E6088 / R6088C5: '1'
## Warning: Coercing text to numeric in E6089 / R6089C5: '1'
## Warning: Coercing text to numeric in E6090 / R6090C5: '1'
## Warning: Coercing text to numeric in E6091 / R6091C5: '1'
## Warning: Coercing text to numeric in E6092 / R6092C5: '2'
## Warning: Coercing text to numeric in E6093 / R6093C5: '2'
## Warning: Coercing text to numeric in E6094 / R6094C5: '2'
## Warning: Coercing text to numeric in E6095 / R6095C5: '2'
## Warning: Coercing text to numeric in E6096 / R6096C5: '2'
## Warning: Coercing text to numeric in E6097 / R6097C5: '2'
## Warning: Coercing text to numeric in E6098 / R6098C5: '2'
## Warning: Coercing text to numeric in E6099 / R6099C5: '2'
## Warning: Coercing text to numeric in E6100 / R6100C5: '2'
## Warning: Coercing text to numeric in E6101 / R6101C5: '2'
## Warning: Coercing text to numeric in E6102 / R6102C5: '2'
## Warning: Coercing text to numeric in E6103 / R6103C5: '2'
## Warning: Coercing text to numeric in E6104 / R6104C5: '1'
## Warning: Coercing text to numeric in E6105 / R6105C5: '1'
## Warning: Coercing text to numeric in E6106 / R6106C5: '1'
## Warning: Coercing text to numeric in E6107 / R6107C5: '1'
## Warning: Coercing text to numeric in E6108 / R6108C5: '1'
## Warning: Coercing text to numeric in E6109 / R6109C5: '1'
## Warning: Coercing text to numeric in E6110 / R6110C5: '2'
## Warning: Coercing text to numeric in E6111 / R6111C5: '2'
## Warning: Coercing text to numeric in E6112 / R6112C5: '2'
## Warning: Coercing text to numeric in E6113 / R6113C5: '2'
## Warning: Coercing text to numeric in E6114 / R6114C5: '2'
## Warning: Coercing text to numeric in E6115 / R6115C5: '2'
## Warning: Coercing text to numeric in E6116 / R6116C5: '1'
## Warning: Coercing text to numeric in E6117 / R6117C5: '1'
## Warning: Coercing text to numeric in E6118 / R6118C5: '1'
## Warning: Coercing text to numeric in E6119 / R6119C5: '1'
## Warning: Coercing text to numeric in E6120 / R6120C5: '1'
## Warning: Coercing text to numeric in E6121 / R6121C5: '1'
## Warning: Coercing text to numeric in E6122 / R6122C5: '1'
## Warning: Coercing text to numeric in E6123 / R6123C5: '1'
## Warning: Coercing text to numeric in E6124 / R6124C5: '1'
## Warning: Coercing text to numeric in E6125 / R6125C5: '1'
## Warning: Coercing text to numeric in E6126 / R6126C5: '1'
## Warning: Coercing text to numeric in E6127 / R6127C5: '1'
## Warning: Coercing text to numeric in E6128 / R6128C5: '1'
## Warning: Coercing text to numeric in E6129 / R6129C5: '1'
## Warning: Coercing text to numeric in E6130 / R6130C5: '1'
## Warning: Coercing text to numeric in E6131 / R6131C5: '1'
## Warning: Coercing text to numeric in E6132 / R6132C5: '1'
## Warning: Coercing text to numeric in E6133 / R6133C5: '1'
## Warning: Coercing text to numeric in E6134 / R6134C5: '2'
## Warning: Coercing text to numeric in E6135 / R6135C5: '2'
## Warning: Coercing text to numeric in E6136 / R6136C5: '2'
## Warning: Coercing text to numeric in E6137 / R6137C5: '2'
## Warning: Coercing text to numeric in E6138 / R6138C5: '2'
## Warning: Coercing text to numeric in E6139 / R6139C5: '2'
## Warning: Coercing text to numeric in E6140 / R6140C5: '1'
## Warning: Coercing text to numeric in E6141 / R6141C5: '1'
## Warning: Coercing text to numeric in E6142 / R6142C5: '1'
## Warning: Coercing text to numeric in E6143 / R6143C5: '1'
## Warning: Coercing text to numeric in E6144 / R6144C5: '1'
## Warning: Coercing text to numeric in E6145 / R6145C5: '1'
## Warning: Coercing text to numeric in E6146 / R6146C5: '2'
## Warning: Coercing text to numeric in E6147 / R6147C5: '2'
## Warning: Coercing text to numeric in E6148 / R6148C5: '2'
## Warning: Coercing text to numeric in E6149 / R6149C5: '2'
## Warning: Coercing text to numeric in E6150 / R6150C5: '2'
## Warning: Coercing text to numeric in E6151 / R6151C5: '2'
## Warning: Coercing text to numeric in E6152 / R6152C5: '2'
## Warning: Coercing text to numeric in E6153 / R6153C5: '2'
## Warning: Coercing text to numeric in E6154 / R6154C5: '2'
## Warning: Coercing text to numeric in E6155 / R6155C5: '2'
## Warning: Coercing text to numeric in E6156 / R6156C5: '2'
## Warning: Coercing text to numeric in E6157 / R6157C5: '2'
## Warning: Coercing text to numeric in E6158 / R6158C5: '1'
## Warning: Coercing text to numeric in E6159 / R6159C5: '1'
## Warning: Coercing text to numeric in E6160 / R6160C5: '1'
## Warning: Coercing text to numeric in E6161 / R6161C5: '1'
## Warning: Coercing text to numeric in E6162 / R6162C5: '1'
## Warning: Coercing text to numeric in E6163 / R6163C5: '1'
## Warning: Coercing text to numeric in E6164 / R6164C5: '1'
## Warning: Coercing text to numeric in E6165 / R6165C5: '1'
## Warning: Coercing text to numeric in E6166 / R6166C5: '1'
## Warning: Coercing text to numeric in E6167 / R6167C5: '1'
## Warning: Coercing text to numeric in E6168 / R6168C5: '1'
## Warning: Coercing text to numeric in E6169 / R6169C5: '1'
## Warning: Coercing text to numeric in E6170 / R6170C5: '2'
## Warning: Coercing text to numeric in E6171 / R6171C5: '2'
## Warning: Coercing text to numeric in E6172 / R6172C5: '2'
## Warning: Coercing text to numeric in E6173 / R6173C5: '2'
## Warning: Coercing text to numeric in E6174 / R6174C5: '2'
## Warning: Coercing text to numeric in E6175 / R6175C5: '2'
## Warning: Coercing text to numeric in E6176 / R6176C5: '2'
## Warning: Coercing text to numeric in E6177 / R6177C5: '2'
## Warning: Coercing text to numeric in E6178 / R6178C5: '2'
## Warning: Coercing text to numeric in E6179 / R6179C5: '2'
## Warning: Coercing text to numeric in E6180 / R6180C5: '2'
## Warning: Coercing text to numeric in E6181 / R6181C5: '2'
## Warning: Coercing text to numeric in E6182 / R6182C5: '2'
## Warning: Coercing text to numeric in E6183 / R6183C5: '2'
## Warning: Coercing text to numeric in E6184 / R6184C5: '2'
## Warning: Coercing text to numeric in E6185 / R6185C5: '2'
## Warning: Coercing text to numeric in E6186 / R6186C5: '2'
## Warning: Coercing text to numeric in E6187 / R6187C5: '2'
## Warning: Coercing text to numeric in E6188 / R6188C5: '1'
## Warning: Coercing text to numeric in E6189 / R6189C5: '1'
## Warning: Coercing text to numeric in E6190 / R6190C5: '1'
## Warning: Coercing text to numeric in E6191 / R6191C5: '1'
## Warning: Coercing text to numeric in E6192 / R6192C5: '1'
## Warning: Coercing text to numeric in E6193 / R6193C5: '1'
## Warning: Coercing text to numeric in E6194 / R6194C5: '1'
## Warning: Coercing text to numeric in E6195 / R6195C5: '1'
## Warning: Coercing text to numeric in E6196 / R6196C5: '1'
## Warning: Coercing text to numeric in E6197 / R6197C5: '1'
## Warning: Coercing text to numeric in E6198 / R6198C5: '1'
## Warning: Coercing text to numeric in E6199 / R6199C5: '1'
## Warning: Coercing text to numeric in E6200 / R6200C5: '1'
## Warning: Coercing text to numeric in E6201 / R6201C5: '1'
## Warning: Coercing text to numeric in E6202 / R6202C5: '1'
## Warning: Coercing text to numeric in E6203 / R6203C5: '1'
## Warning: Coercing text to numeric in E6204 / R6204C5: '1'
## Warning: Coercing text to numeric in E6205 / R6205C5: '1'
## Warning: Coercing text to numeric in E6206 / R6206C5: '2'
## Warning: Coercing text to numeric in E6207 / R6207C5: '2'
## Warning: Coercing text to numeric in E6208 / R6208C5: '2'
## Warning: Coercing text to numeric in E6209 / R6209C5: '2'
## Warning: Coercing text to numeric in E6210 / R6210C5: '2'
## Warning: Coercing text to numeric in E6211 / R6211C5: '2'
## Warning: Coercing text to numeric in E6212 / R6212C5: '1'
## Warning: Coercing text to numeric in E6213 / R6213C5: '1'
## Warning: Coercing text to numeric in E6214 / R6214C5: '1'
## Warning: Coercing text to numeric in E6215 / R6215C5: '1'
## Warning: Coercing text to numeric in E6216 / R6216C5: '1'
## Warning: Coercing text to numeric in E6217 / R6217C5: '1'
## Warning: Coercing text to numeric in E6218 / R6218C5: '1'
## Warning: Coercing text to numeric in E6219 / R6219C5: '1'
## Warning: Coercing text to numeric in E6220 / R6220C5: '1'
## Warning: Coercing text to numeric in E6221 / R6221C5: '1'
## Warning: Coercing text to numeric in E6222 / R6222C5: '1'
## Warning: Coercing text to numeric in E6223 / R6223C5: '1'
## Warning: Coercing text to numeric in E6224 / R6224C5: '2'
## Warning: Coercing text to numeric in E6225 / R6225C5: '2'
## Warning: Coercing text to numeric in E6226 / R6226C5: '2'
## Warning: Coercing text to numeric in E6227 / R6227C5: '2'
## Warning: Coercing text to numeric in E6228 / R6228C5: '2'
## Warning: Coercing text to numeric in E6229 / R6229C5: '2'
## Warning: Coercing text to numeric in E6230 / R6230C5: '2'
## Warning: Coercing text to numeric in E6231 / R6231C5: '2'
## Warning: Coercing text to numeric in E6232 / R6232C5: '2'
## Warning: Coercing text to numeric in E6233 / R6233C5: '2'
## Warning: Coercing text to numeric in E6234 / R6234C5: '2'
## Warning: Coercing text to numeric in E6235 / R6235C5: '2'
## Warning: Coercing text to numeric in E6236 / R6236C5: '2'
## Warning: Coercing text to numeric in E6237 / R6237C5: '2'
## Warning: Coercing text to numeric in E6238 / R6238C5: '2'
## Warning: Coercing text to numeric in E6239 / R6239C5: '2'
## Warning: Coercing text to numeric in E6240 / R6240C5: '2'
## Warning: Coercing text to numeric in E6241 / R6241C5: '2'
## Warning: Coercing text to numeric in E6242 / R6242C5: '1'
## Warning: Coercing text to numeric in E6243 / R6243C5: '1'
## Warning: Coercing text to numeric in E6244 / R6244C5: '1'
## Warning: Coercing text to numeric in E6245 / R6245C5: '1'
## Warning: Coercing text to numeric in E6246 / R6246C5: '1'
## Warning: Coercing text to numeric in E6247 / R6247C5: '1'
## Warning: Coercing text to numeric in E6248 / R6248C5: '1'
## Warning: Coercing text to numeric in E6249 / R6249C5: '1'
## Warning: Coercing text to numeric in E6250 / R6250C5: '1'
## Warning: Coercing text to numeric in E6251 / R6251C5: '1'
## Warning: Coercing text to numeric in E6252 / R6252C5: '1'
## Warning: Coercing text to numeric in E6253 / R6253C5: '1'
## Warning: Coercing text to numeric in E6254 / R6254C5: '2'
## Warning: Coercing text to numeric in E6255 / R6255C5: '2'
## Warning: Coercing text to numeric in E6256 / R6256C5: '2'
## Warning: Coercing text to numeric in E6257 / R6257C5: '2'
## Warning: Coercing text to numeric in E6258 / R6258C5: '2'
## Warning: Coercing text to numeric in E6259 / R6259C5: '2'
## Warning: Coercing text to numeric in E6260 / R6260C5: '2'
## Warning: Coercing text to numeric in E6261 / R6261C5: '2'
## Warning: Coercing text to numeric in E6262 / R6262C5: '2'
## Warning: Coercing text to numeric in E6263 / R6263C5: '2'
## Warning: Coercing text to numeric in E6264 / R6264C5: '2'
## Warning: Coercing text to numeric in E6265 / R6265C5: '2'
## Warning: Coercing text to numeric in E6266 / R6266C5: '1'
## Warning: Coercing text to numeric in E6267 / R6267C5: '1'
## Warning: Coercing text to numeric in E6268 / R6268C5: '1'
## Warning: Coercing text to numeric in E6269 / R6269C5: '1'
## Warning: Coercing text to numeric in E6270 / R6270C5: '1'
## Warning: Coercing text to numeric in E6271 / R6271C5: '1'
## Warning: Coercing text to numeric in E6272 / R6272C5: '1'
## Warning: Coercing text to numeric in E6273 / R6273C5: '1'
## Warning: Coercing text to numeric in E6274 / R6274C5: '1'
## Warning: Coercing text to numeric in E6275 / R6275C5: '1'
## Warning: Coercing text to numeric in E6276 / R6276C5: '1'
## Warning: Coercing text to numeric in E6277 / R6277C5: '1'
## Warning: Coercing text to numeric in E6278 / R6278C5: '1'
## Warning: Coercing text to numeric in E6279 / R6279C5: '1'
## Warning: Coercing text to numeric in E6280 / R6280C5: '1'
## Warning: Coercing text to numeric in E6281 / R6281C5: '1'
## Warning: Coercing text to numeric in E6282 / R6282C5: '1'
## Warning: Coercing text to numeric in E6283 / R6283C5: '1'
## Warning: Coercing text to numeric in E6284 / R6284C5: '2'
## Warning: Coercing text to numeric in E6285 / R6285C5: '2'
## Warning: Coercing text to numeric in E6286 / R6286C5: '2'
## Warning: Coercing text to numeric in E6287 / R6287C5: '2'
## Warning: Coercing text to numeric in E6288 / R6288C5: '2'
## Warning: Coercing text to numeric in E6289 / R6289C5: '2'
## Warning: Coercing text to numeric in E6290 / R6290C5: '2'
## Warning: Coercing text to numeric in E6291 / R6291C5: '2'
## Warning: Coercing text to numeric in E6292 / R6292C5: '2'
## Warning: Coercing text to numeric in E6293 / R6293C5: '2'
## Warning: Coercing text to numeric in E6294 / R6294C5: '2'
## Warning: Coercing text to numeric in E6295 / R6295C5: '2'
## Warning: Coercing text to numeric in E6296 / R6296C5: '1'
## Warning: Coercing text to numeric in E6297 / R6297C5: '1'
## Warning: Coercing text to numeric in E6298 / R6298C5: '1'
## Warning: Coercing text to numeric in E6299 / R6299C5: '1'
## Warning: Coercing text to numeric in E6300 / R6300C5: '1'
## Warning: Coercing text to numeric in E6301 / R6301C5: '1'
## Warning: Coercing text to numeric in E6302 / R6302C5: '2'
## Warning: Coercing text to numeric in E6303 / R6303C5: '2'
## Warning: Coercing text to numeric in E6304 / R6304C5: '2'
## Warning: Coercing text to numeric in E6305 / R6305C5: '2'
## Warning: Coercing text to numeric in E6306 / R6306C5: '2'
## Warning: Coercing text to numeric in E6307 / R6307C5: '2'
## Warning: Coercing text to numeric in E6308 / R6308C5: '2'
## Warning: Coercing text to numeric in E6309 / R6309C5: '2'
## Warning: Coercing text to numeric in E6310 / R6310C5: '2'
## Warning: Coercing text to numeric in E6311 / R6311C5: '2'
## Warning: Coercing text to numeric in E6312 / R6312C5: '2'
## Warning: Coercing text to numeric in E6313 / R6313C5: '2'
## Warning: Coercing text to numeric in E6314 / R6314C5: '2'
## Warning: Coercing text to numeric in E6315 / R6315C5: '2'
## Warning: Coercing text to numeric in E6316 / R6316C5: '2'
## Warning: Coercing text to numeric in E6317 / R6317C5: '2'
## Warning: Coercing text to numeric in E6318 / R6318C5: '2'
## Warning: Coercing text to numeric in E6319 / R6319C5: '2'
## Warning: Coercing text to numeric in E6320 / R6320C5: '2'
## Warning: Coercing text to numeric in E6321 / R6321C5: '2'
## Warning: Coercing text to numeric in E6322 / R6322C5: '2'
## Warning: Coercing text to numeric in E6323 / R6323C5: '2'
## Warning: Coercing text to numeric in E6324 / R6324C5: '2'
## Warning: Coercing text to numeric in E6325 / R6325C5: '2'
## Warning: Coercing text to numeric in E6326 / R6326C5: '2'
## Warning: Coercing text to numeric in E6327 / R6327C5: '2'
## Warning: Coercing text to numeric in E6328 / R6328C5: '2'
## Warning: Coercing text to numeric in E6329 / R6329C5: '2'
## Warning: Coercing text to numeric in E6330 / R6330C5: '2'
## Warning: Coercing text to numeric in E6331 / R6331C5: '2'
## Warning: Coercing text to numeric in E6332 / R6332C5: '2'
## Warning: Coercing text to numeric in E6333 / R6333C5: '2'
## Warning: Coercing text to numeric in E6334 / R6334C5: '2'
## Warning: Coercing text to numeric in E6335 / R6335C5: '2'
## Warning: Coercing text to numeric in E6336 / R6336C5: '2'
## Warning: Coercing text to numeric in E6337 / R6337C5: '2'
## Warning: Coercing text to numeric in E6338 / R6338C5: '1'
## Warning: Coercing text to numeric in E6339 / R6339C5: '1'
## Warning: Coercing text to numeric in E6340 / R6340C5: '1'
## Warning: Coercing text to numeric in E6341 / R6341C5: '1'
## Warning: Coercing text to numeric in E6342 / R6342C5: '1'
## Warning: Coercing text to numeric in E6343 / R6343C5: '1'
## Warning: Coercing text to numeric in E6344 / R6344C5: '2'
## Warning: Coercing text to numeric in E6345 / R6345C5: '2'
## Warning: Coercing text to numeric in E6346 / R6346C5: '2'
## Warning: Coercing text to numeric in E6347 / R6347C5: '2'
## Warning: Coercing text to numeric in E6348 / R6348C5: '2'
## Warning: Coercing text to numeric in E6349 / R6349C5: '2'
## Warning: Coercing text to numeric in E6350 / R6350C5: '1'
## Warning: Coercing text to numeric in E6351 / R6351C5: '1'
## Warning: Coercing text to numeric in E6352 / R6352C5: '1'
## Warning: Coercing text to numeric in E6353 / R6353C5: '1'
## Warning: Coercing text to numeric in E6354 / R6354C5: '1'
## Warning: Coercing text to numeric in E6355 / R6355C5: '1'
## Warning: Coercing text to numeric in E6356 / R6356C5: '2'
## Warning: Coercing text to numeric in E6357 / R6357C5: '2'
## Warning: Coercing text to numeric in E6358 / R6358C5: '2'
## Warning: Coercing text to numeric in E6359 / R6359C5: '2'
## Warning: Coercing text to numeric in E6360 / R6360C5: '2'
## Warning: Coercing text to numeric in E6361 / R6361C5: '2'
## Warning: Coercing text to numeric in E6362 / R6362C5: '1'
## Warning: Coercing text to numeric in E6363 / R6363C5: '1'
## Warning: Coercing text to numeric in E6364 / R6364C5: '1'
## Warning: Coercing text to numeric in E6365 / R6365C5: '1'
## Warning: Coercing text to numeric in E6366 / R6366C5: '1'
## Warning: Coercing text to numeric in E6367 / R6367C5: '1'
## Warning: Coercing text to numeric in E6368 / R6368C5: '1'
## Warning: Coercing text to numeric in E6369 / R6369C5: '1'
## Warning: Coercing text to numeric in E6370 / R6370C5: '1'
## Warning: Coercing text to numeric in E6371 / R6371C5: '1'
## Warning: Coercing text to numeric in E6372 / R6372C5: '1'
## Warning: Coercing text to numeric in E6373 / R6373C5: '1'
## Warning: Coercing text to numeric in E6374 / R6374C5: '2'
## Warning: Coercing text to numeric in E6375 / R6375C5: '2'
## Warning: Coercing text to numeric in E6376 / R6376C5: '2'
## Warning: Coercing text to numeric in E6377 / R6377C5: '2'
## Warning: Coercing text to numeric in E6378 / R6378C5: '2'
## Warning: Coercing text to numeric in E6379 / R6379C5: '2'
## Warning: Coercing text to numeric in E6380 / R6380C5: '1'
## Warning: Coercing text to numeric in E6381 / R6381C5: '1'
## Warning: Coercing text to numeric in E6382 / R6382C5: '1'
## Warning: Coercing text to numeric in E6383 / R6383C5: '1'
## Warning: Coercing text to numeric in E6384 / R6384C5: '1'
## Warning: Coercing text to numeric in E6385 / R6385C5: '1'
## Warning: Coercing text to numeric in E6386 / R6386C5: '1'
## Warning: Coercing text to numeric in E6387 / R6387C5: '1'
## Warning: Coercing text to numeric in E6388 / R6388C5: '1'
## Warning: Coercing text to numeric in E6389 / R6389C5: '1'
## Warning: Coercing text to numeric in E6390 / R6390C5: '1'
## Warning: Coercing text to numeric in E6391 / R6391C5: '1'
## Warning: Coercing text to numeric in E6392 / R6392C5: '2'
## Warning: Coercing text to numeric in E6393 / R6393C5: '2'
## Warning: Coercing text to numeric in E6394 / R6394C5: '2'
## Warning: Coercing text to numeric in E6395 / R6395C5: '2'
## Warning: Coercing text to numeric in E6396 / R6396C5: '2'
## Warning: Coercing text to numeric in E6397 / R6397C5: '2'
## Warning: Coercing text to numeric in E6398 / R6398C5: '2'
## Warning: Coercing text to numeric in E6399 / R6399C5: '2'
## Warning: Coercing text to numeric in E6400 / R6400C5: '2'
## Warning: Coercing text to numeric in E6401 / R6401C5: '2'
## Warning: Coercing text to numeric in E6402 / R6402C5: '2'
## Warning: Coercing text to numeric in E6403 / R6403C5: '2'
## Warning: Coercing text to numeric in E6404 / R6404C5: '1'
## Warning: Coercing text to numeric in E6405 / R6405C5: '1'
## Warning: Coercing text to numeric in E6406 / R6406C5: '1'
## Warning: Coercing text to numeric in E6407 / R6407C5: '1'
## Warning: Coercing text to numeric in E6408 / R6408C5: '1'
## Warning: Coercing text to numeric in E6409 / R6409C5: '1'
## Warning: Coercing text to numeric in E6410 / R6410C5: '1'
## Warning: Coercing text to numeric in E6411 / R6411C5: '1'
## Warning: Coercing text to numeric in E6412 / R6412C5: '1'
## Warning: Coercing text to numeric in E6413 / R6413C5: '1'
## Warning: Coercing text to numeric in E6414 / R6414C5: '1'
## Warning: Coercing text to numeric in E6415 / R6415C5: '1'
## Warning: Coercing text to numeric in E6416 / R6416C5: '1'
## Warning: Coercing text to numeric in E6417 / R6417C5: '1'
## Warning: Coercing text to numeric in E6418 / R6418C5: '1'
## Warning: Coercing text to numeric in E6419 / R6419C5: '1'
## Warning: Coercing text to numeric in E6420 / R6420C5: '1'
## Warning: Coercing text to numeric in E6421 / R6421C5: '1'
## Warning: Coercing text to numeric in E6422 / R6422C5: '2'
## Warning: Coercing text to numeric in E6423 / R6423C5: '2'
## Warning: Coercing text to numeric in E6424 / R6424C5: '2'
## Warning: Coercing text to numeric in E6425 / R6425C5: '2'
## Warning: Coercing text to numeric in E6426 / R6426C5: '2'
## Warning: Coercing text to numeric in E6427 / R6427C5: '2'
## Warning: Coercing text to numeric in E6428 / R6428C5: '1'
## Warning: Coercing text to numeric in E6429 / R6429C5: '1'
## Warning: Coercing text to numeric in E6430 / R6430C5: '1'
## Warning: Coercing text to numeric in E6431 / R6431C5: '1'
## Warning: Coercing text to numeric in E6432 / R6432C5: '1'
## Warning: Coercing text to numeric in E6433 / R6433C5: '1'
## Warning: Coercing text to numeric in E6434 / R6434C5: '1'
## Warning: Coercing text to numeric in E6435 / R6435C5: '1'
## Warning: Coercing text to numeric in E6436 / R6436C5: '1'
## Warning: Coercing text to numeric in E6437 / R6437C5: '1'
## Warning: Coercing text to numeric in E6438 / R6438C5: '1'
## Warning: Coercing text to numeric in E6439 / R6439C5: '1'
## Warning: Coercing text to numeric in E6440 / R6440C5: '1'
## Warning: Coercing text to numeric in E6441 / R6441C5: '1'
## Warning: Coercing text to numeric in E6442 / R6442C5: '1'
## Warning: Coercing text to numeric in E6443 / R6443C5: '1'
## Warning: Coercing text to numeric in E6444 / R6444C5: '1'
## Warning: Coercing text to numeric in E6445 / R6445C5: '1'
## Warning: Coercing text to numeric in E6446 / R6446C5: '2'
## Warning: Coercing text to numeric in E6447 / R6447C5: '2'
## Warning: Coercing text to numeric in E6448 / R6448C5: '2'
## Warning: Coercing text to numeric in E6449 / R6449C5: '2'
## Warning: Coercing text to numeric in E6450 / R6450C5: '2'
## Warning: Coercing text to numeric in E6451 / R6451C5: '2'
## Warning: Coercing text to numeric in E6452 / R6452C5: '2'
## Warning: Coercing text to numeric in E6453 / R6453C5: '2'
## Warning: Coercing text to numeric in E6454 / R6454C5: '2'
## Warning: Coercing text to numeric in E6455 / R6455C5: '2'
## Warning: Coercing text to numeric in E6456 / R6456C5: '2'
## Warning: Coercing text to numeric in E6457 / R6457C5: '2'
## Warning: Coercing text to numeric in E6458 / R6458C5: '2'
## Warning: Coercing text to numeric in E6459 / R6459C5: '2'
## Warning: Coercing text to numeric in E6460 / R6460C5: '2'
## Warning: Coercing text to numeric in E6461 / R6461C5: '2'
## Warning: Coercing text to numeric in E6462 / R6462C5: '2'
## Warning: Coercing text to numeric in E6463 / R6463C5: '2'
## Warning: Coercing text to numeric in E6464 / R6464C5: '2'
## Warning: Coercing text to numeric in E6465 / R6465C5: '2'
## Warning: Coercing text to numeric in E6466 / R6466C5: '2'
## Warning: Coercing text to numeric in E6467 / R6467C5: '2'
## Warning: Coercing text to numeric in E6468 / R6468C5: '2'
## Warning: Coercing text to numeric in E6469 / R6469C5: '2'
## Warning: Coercing text to numeric in E6470 / R6470C5: '2'
## Warning: Coercing text to numeric in E6471 / R6471C5: '2'
## Warning: Coercing text to numeric in E6472 / R6472C5: '2'
## Warning: Coercing text to numeric in E6473 / R6473C5: '2'
## Warning: Coercing text to numeric in E6474 / R6474C5: '2'
## Warning: Coercing text to numeric in E6475 / R6475C5: '2'
## Warning: Coercing text to numeric in E6476 / R6476C5: '1'
## Warning: Coercing text to numeric in E6477 / R6477C5: '1'
## Warning: Coercing text to numeric in E6478 / R6478C5: '1'
## Warning: Coercing text to numeric in E6479 / R6479C5: '1'
## Warning: Coercing text to numeric in E6480 / R6480C5: '1'
## Warning: Coercing text to numeric in E6481 / R6481C5: '1'
## Warning: Coercing text to numeric in E6482 / R6482C5: '1'
## Warning: Coercing text to numeric in E6483 / R6483C5: '1'
## Warning: Coercing text to numeric in E6484 / R6484C5: '1'
## Warning: Coercing text to numeric in E6485 / R6485C5: '1'
## Warning: Coercing text to numeric in E6486 / R6486C5: '1'
## Warning: Coercing text to numeric in E6487 / R6487C5: '1'
## Warning: Coercing text to numeric in E6488 / R6488C5: '1'
## Warning: Coercing text to numeric in E6489 / R6489C5: '1'
## Warning: Coercing text to numeric in E6490 / R6490C5: '1'
## Warning: Coercing text to numeric in E6491 / R6491C5: '1'
## Warning: Coercing text to numeric in E6492 / R6492C5: '1'
## Warning: Coercing text to numeric in E6493 / R6493C5: '1'
## Warning: Coercing text to numeric in E6494 / R6494C5: '2'
## Warning: Coercing text to numeric in E6495 / R6495C5: '2'
## Warning: Coercing text to numeric in E6496 / R6496C5: '2'
## Warning: Coercing text to numeric in E6497 / R6497C5: '2'
## Warning: Coercing text to numeric in E6498 / R6498C5: '2'
## Warning: Coercing text to numeric in E6499 / R6499C5: '2'
## Warning: Coercing text to numeric in E6500 / R6500C5: '2'
## Warning: Coercing text to numeric in E6501 / R6501C5: '2'
## Warning: Coercing text to numeric in E6502 / R6502C5: '2'
## Warning: Coercing text to numeric in E6503 / R6503C5: '2'
## Warning: Coercing text to numeric in E6504 / R6504C5: '2'
## Warning: Coercing text to numeric in E6505 / R6505C5: '2'
## Warning: Coercing text to numeric in E6506 / R6506C5: '2'
## Warning: Coercing text to numeric in E6507 / R6507C5: '2'
## Warning: Coercing text to numeric in E6508 / R6508C5: '2'
## Warning: Coercing text to numeric in E6509 / R6509C5: '2'
## Warning: Coercing text to numeric in E6510 / R6510C5: '2'
## Warning: Coercing text to numeric in E6511 / R6511C5: '2'
## Warning: Coercing text to numeric in E6512 / R6512C5: '1'
## Warning: Coercing text to numeric in E6513 / R6513C5: '1'
## Warning: Coercing text to numeric in E6514 / R6514C5: '1'
## Warning: Coercing text to numeric in E6515 / R6515C5: '1'
## Warning: Coercing text to numeric in E6516 / R6516C5: '1'
## Warning: Coercing text to numeric in E6517 / R6517C5: '1'
## Warning: Coercing text to numeric in E6518 / R6518C5: '2'
## Warning: Coercing text to numeric in E6519 / R6519C5: '2'
## Warning: Coercing text to numeric in E6520 / R6520C5: '2'
## Warning: Coercing text to numeric in E6521 / R6521C5: '2'
## Warning: Coercing text to numeric in E6522 / R6522C5: '2'
## Warning: Coercing text to numeric in E6523 / R6523C5: '2'
## Warning: Coercing text to numeric in E6524 / R6524C5: '1'
## Warning: Coercing text to numeric in E6525 / R6525C5: '1'
## Warning: Coercing text to numeric in E6526 / R6526C5: '1'
## Warning: Coercing text to numeric in E6527 / R6527C5: '1'
## Warning: Coercing text to numeric in E6528 / R6528C5: '1'
## Warning: Coercing text to numeric in E6529 / R6529C5: '1'
## Warning: Coercing text to numeric in E6530 / R6530C5: '1'
## Warning: Coercing text to numeric in E6531 / R6531C5: '1'
## Warning: Coercing text to numeric in E6532 / R6532C5: '1'
## Warning: Coercing text to numeric in E6533 / R6533C5: '1'
## Warning: Coercing text to numeric in E6534 / R6534C5: '1'
## Warning: Coercing text to numeric in E6535 / R6535C5: '1'
## Warning: Coercing text to numeric in E6536 / R6536C5: '1'
## Warning: Coercing text to numeric in E6537 / R6537C5: '1'
## Warning: Coercing text to numeric in E6538 / R6538C5: '1'
## Warning: Coercing text to numeric in E6539 / R6539C5: '1'
## Warning: Coercing text to numeric in E6540 / R6540C5: '1'
## Warning: Coercing text to numeric in E6541 / R6541C5: '1'
## Warning: Coercing text to numeric in E6542 / R6542C5: '2'
## Warning: Coercing text to numeric in E6543 / R6543C5: '2'
## Warning: Coercing text to numeric in E6544 / R6544C5: '2'
## Warning: Coercing text to numeric in E6545 / R6545C5: '2'
## Warning: Coercing text to numeric in E6546 / R6546C5: '2'
## Warning: Coercing text to numeric in E6547 / R6547C5: '2'
## Warning: Coercing text to numeric in E6548 / R6548C5: '2'
## Warning: Coercing text to numeric in E6549 / R6549C5: '2'
## Warning: Coercing text to numeric in E6550 / R6550C5: '2'
## Warning: Coercing text to numeric in E6551 / R6551C5: '2'
## Warning: Coercing text to numeric in E6552 / R6552C5: '2'
## Warning: Coercing text to numeric in E6553 / R6553C5: '2'
## Warning: Coercing text to numeric in E6554 / R6554C5: '1'
## Warning: Coercing text to numeric in E6555 / R6555C5: '1'
## Warning: Coercing text to numeric in E6556 / R6556C5: '1'
## Warning: Coercing text to numeric in E6557 / R6557C5: '1'
## Warning: Coercing text to numeric in E6558 / R6558C5: '1'
## Warning: Coercing text to numeric in E6559 / R6559C5: '1'
## Warning: Coercing text to numeric in E6560 / R6560C5: '1'
## Warning: Coercing text to numeric in E6561 / R6561C5: '1'
## Warning: Coercing text to numeric in E6562 / R6562C5: '1'
## Warning: Coercing text to numeric in E6563 / R6563C5: '1'
## Warning: Coercing text to numeric in E6564 / R6564C5: '1'
## Warning: Coercing text to numeric in E6565 / R6565C5: '1'
## Warning: Coercing text to numeric in E6566 / R6566C5: '1'
## Warning: Coercing text to numeric in E6567 / R6567C5: '1'
## Warning: Coercing text to numeric in E6568 / R6568C5: '1'
## Warning: Coercing text to numeric in E6569 / R6569C5: '1'
## Warning: Coercing text to numeric in E6570 / R6570C5: '1'
## Warning: Coercing text to numeric in E6571 / R6571C5: '1'
## Warning: Coercing text to numeric in E6572 / R6572C5: '1'
## Warning: Coercing text to numeric in E6573 / R6573C5: '1'
## Warning: Coercing text to numeric in E6574 / R6574C5: '1'
## Warning: Coercing text to numeric in E6575 / R6575C5: '1'
## Warning: Coercing text to numeric in E6576 / R6576C5: '1'
## Warning: Coercing text to numeric in E6577 / R6577C5: '1'
## Warning: Coercing text to numeric in E6578 / R6578C5: '2'
## Warning: Coercing text to numeric in E6579 / R6579C5: '2'
## Warning: Coercing text to numeric in E6580 / R6580C5: '2'
## Warning: Coercing text to numeric in E6581 / R6581C5: '2'
## Warning: Coercing text to numeric in E6582 / R6582C5: '2'
## Warning: Coercing text to numeric in E6583 / R6583C5: '2'
## Warning: Coercing text to numeric in E6584 / R6584C5: '1'
## Warning: Coercing text to numeric in E6585 / R6585C5: '1'
## Warning: Coercing text to numeric in E6586 / R6586C5: '1'
## Warning: Coercing text to numeric in E6587 / R6587C5: '1'
## Warning: Coercing text to numeric in E6588 / R6588C5: '1'
## Warning: Coercing text to numeric in E6589 / R6589C5: '1'
## Warning: Coercing text to numeric in E6590 / R6590C5: '1'
## Warning: Coercing text to numeric in E6591 / R6591C5: '1'
## Warning: Coercing text to numeric in E6592 / R6592C5: '1'
## Warning: Coercing text to numeric in E6593 / R6593C5: '1'
## Warning: Coercing text to numeric in E6594 / R6594C5: '1'
## Warning: Coercing text to numeric in E6595 / R6595C5: '1'
## Warning: Coercing text to numeric in E6596 / R6596C5: '2'
## Warning: Coercing text to numeric in E6597 / R6597C5: '2'
## Warning: Coercing text to numeric in E6598 / R6598C5: '2'
## Warning: Coercing text to numeric in E6599 / R6599C5: '2'
## Warning: Coercing text to numeric in E6600 / R6600C5: '2'
## Warning: Coercing text to numeric in E6601 / R6601C5: '2'
## Warning: Coercing text to numeric in E6602 / R6602C5: '2'
## Warning: Coercing text to numeric in E6603 / R6603C5: '2'
## Warning: Coercing text to numeric in E6604 / R6604C5: '2'
## Warning: Coercing text to numeric in E6605 / R6605C5: '2'
## Warning: Coercing text to numeric in E6606 / R6606C5: '2'
## Warning: Coercing text to numeric in E6607 / R6607C5: '2'
## Warning: Coercing text to numeric in E6608 / R6608C5: '2'
## Warning: Coercing text to numeric in E6609 / R6609C5: '2'
## Warning: Coercing text to numeric in E6610 / R6610C5: '2'
## Warning: Coercing text to numeric in E6611 / R6611C5: '2'
## Warning: Coercing text to numeric in E6612 / R6612C5: '2'
## Warning: Coercing text to numeric in E6613 / R6613C5: '2'
## Warning: Coercing text to numeric in E6614 / R6614C5: '2'
## Warning: Coercing text to numeric in E6615 / R6615C5: '2'
## Warning: Coercing text to numeric in E6616 / R6616C5: '2'
## Warning: Coercing text to numeric in E6617 / R6617C5: '2'
## Warning: Coercing text to numeric in E6618 / R6618C5: '2'
## Warning: Coercing text to numeric in E6619 / R6619C5: '2'
## Warning: Coercing text to numeric in E6620 / R6620C5: '1'
## Warning: Coercing text to numeric in E6621 / R6621C5: '1'
## Warning: Coercing text to numeric in E6622 / R6622C5: '1'
## Warning: Coercing text to numeric in E6623 / R6623C5: '1'
## Warning: Coercing text to numeric in E6624 / R6624C5: '1'
## Warning: Coercing text to numeric in E6625 / R6625C5: '1'
## Warning: Coercing text to numeric in E6626 / R6626C5: '1'
## Warning: Coercing text to numeric in E6627 / R6627C5: '1'
## Warning: Coercing text to numeric in E6628 / R6628C5: '1'
## Warning: Coercing text to numeric in E6629 / R6629C5: '1'
## Warning: Coercing text to numeric in E6630 / R6630C5: '1'
## Warning: Coercing text to numeric in E6631 / R6631C5: '1'
## Warning: Coercing text to numeric in E6632 / R6632C5: '1'
## Warning: Coercing text to numeric in E6633 / R6633C5: '1'
## Warning: Coercing text to numeric in E6634 / R6634C5: '1'
## Warning: Coercing text to numeric in E6635 / R6635C5: '1'
## Warning: Coercing text to numeric in E6636 / R6636C5: '1'
## Warning: Coercing text to numeric in E6637 / R6637C5: '1'
## Warning: Coercing text to numeric in E6638 / R6638C5: '2'
## Warning: Coercing text to numeric in E6639 / R6639C5: '2'
## Warning: Coercing text to numeric in E6640 / R6640C5: '2'
## Warning: Coercing text to numeric in E6641 / R6641C5: '2'
## Warning: Coercing text to numeric in E6642 / R6642C5: '2'
## Warning: Coercing text to numeric in E6643 / R6643C5: '2'
## Warning: Coercing text to numeric in E6644 / R6644C5: '2'
## Warning: Coercing text to numeric in E6645 / R6645C5: '2'
## Warning: Coercing text to numeric in E6646 / R6646C5: '2'
## Warning: Coercing text to numeric in E6647 / R6647C5: '2'
## Warning: Coercing text to numeric in E6648 / R6648C5: '2'
## Warning: Coercing text to numeric in E6649 / R6649C5: '2'
## Warning: Coercing text to numeric in E6650 / R6650C5: '2'
## Warning: Coercing text to numeric in E6651 / R6651C5: '2'
## Warning: Coercing text to numeric in E6652 / R6652C5: '2'
## Warning: Coercing text to numeric in E6653 / R6653C5: '2'
## Warning: Coercing text to numeric in E6654 / R6654C5: '2'
## Warning: Coercing text to numeric in E6655 / R6655C5: '2'
## Warning: Coercing text to numeric in E6656 / R6656C5: '2'
## Warning: Coercing text to numeric in E6657 / R6657C5: '2'
## Warning: Coercing text to numeric in E6658 / R6658C5: '2'
## Warning: Coercing text to numeric in E6659 / R6659C5: '2'
## Warning: Coercing text to numeric in E6660 / R6660C5: '2'
## Warning: Coercing text to numeric in E6661 / R6661C5: '2'
## Warning: Coercing text to numeric in E6662 / R6662C5: '1'
## Warning: Coercing text to numeric in E6663 / R6663C5: '1'
## Warning: Coercing text to numeric in E6664 / R6664C5: '1'
## Warning: Coercing text to numeric in E6665 / R6665C5: '1'
## Warning: Coercing text to numeric in E6666 / R6666C5: '1'
## Warning: Coercing text to numeric in E6667 / R6667C5: '1'
## Warning: Coercing text to numeric in E6668 / R6668C5: '1'
## Warning: Coercing text to numeric in E6669 / R6669C5: '1'
## Warning: Coercing text to numeric in E6670 / R6670C5: '1'
## Warning: Coercing text to numeric in E6671 / R6671C5: '1'
## Warning: Coercing text to numeric in E6672 / R6672C5: '1'
## Warning: Coercing text to numeric in E6673 / R6673C5: '1'
## Warning: Coercing text to numeric in E6674 / R6674C5: '1'
## Warning: Coercing text to numeric in E6675 / R6675C5: '1'
## Warning: Coercing text to numeric in E6676 / R6676C5: '1'
## Warning: Coercing text to numeric in E6677 / R6677C5: '1'
## Warning: Coercing text to numeric in E6678 / R6678C5: '1'
## Warning: Coercing text to numeric in E6679 / R6679C5: '1'
## Warning: Coercing text to numeric in E6680 / R6680C5: '1'
## Warning: Coercing text to numeric in E6681 / R6681C5: '1'
## Warning: Coercing text to numeric in E6682 / R6682C5: '1'
## Warning: Coercing text to numeric in E6683 / R6683C5: '1'
## Warning: Coercing text to numeric in E6684 / R6684C5: '1'
## Warning: Coercing text to numeric in E6685 / R6685C5: '1'
## Warning: Coercing text to numeric in E6686 / R6686C5: '1'
## Warning: Coercing text to numeric in E6687 / R6687C5: '1'
## Warning: Coercing text to numeric in E6688 / R6688C5: '1'
## Warning: Coercing text to numeric in E6689 / R6689C5: '1'
## Warning: Coercing text to numeric in E6690 / R6690C5: '1'
## Warning: Coercing text to numeric in E6691 / R6691C5: '1'
## Warning: Coercing text to numeric in E6692 / R6692C5: '1'
## Warning: Coercing text to numeric in E6693 / R6693C5: '1'
## Warning: Coercing text to numeric in E6694 / R6694C5: '1'
## Warning: Coercing text to numeric in E6695 / R6695C5: '1'
## Warning: Coercing text to numeric in E6696 / R6696C5: '1'
## Warning: Coercing text to numeric in E6697 / R6697C5: '1'
## Warning: Coercing text to numeric in E6698 / R6698C5: '2'
## Warning: Coercing text to numeric in E6699 / R6699C5: '2'
## Warning: Coercing text to numeric in E6700 / R6700C5: '2'
## Warning: Coercing text to numeric in E6701 / R6701C5: '2'
## Warning: Coercing text to numeric in E6702 / R6702C5: '2'
## Warning: Coercing text to numeric in E6703 / R6703C5: '2'
## Warning: Coercing text to numeric in E6704 / R6704C5: '2'
## Warning: Coercing text to numeric in E6705 / R6705C5: '2'
## Warning: Coercing text to numeric in E6706 / R6706C5: '2'
## Warning: Coercing text to numeric in E6707 / R6707C5: '2'
## Warning: Coercing text to numeric in E6708 / R6708C5: '2'
## Warning: Coercing text to numeric in E6709 / R6709C5: '2'
## Warning: Coercing text to numeric in E6710 / R6710C5: '2'
## Warning: Coercing text to numeric in E6711 / R6711C5: '2'
## Warning: Coercing text to numeric in E6712 / R6712C5: '2'
## Warning: Coercing text to numeric in E6713 / R6713C5: '2'
## Warning: Coercing text to numeric in E6714 / R6714C5: '2'
## Warning: Coercing text to numeric in E6715 / R6715C5: '2'
## Warning: Coercing text to numeric in E6716 / R6716C5: '2'
## Warning: Coercing text to numeric in E6717 / R6717C5: '2'
## Warning: Coercing text to numeric in E6718 / R6718C5: '2'
## Warning: Coercing text to numeric in E6719 / R6719C5: '2'
## Warning: Coercing text to numeric in E6720 / R6720C5: '2'
## Warning: Coercing text to numeric in E6721 / R6721C5: '2'
## Warning: Coercing text to numeric in E6722 / R6722C5: '1'
## Warning: Coercing text to numeric in E6723 / R6723C5: '1'
## Warning: Coercing text to numeric in E6724 / R6724C5: '1'
## Warning: Coercing text to numeric in E6725 / R6725C5: '1'
## Warning: Coercing text to numeric in E6726 / R6726C5: '1'
## Warning: Coercing text to numeric in E6727 / R6727C5: '1'
## Warning: Coercing text to numeric in E6728 / R6728C5: '1'
## Warning: Coercing text to numeric in E6729 / R6729C5: '1'
## Warning: Coercing text to numeric in E6730 / R6730C5: '1'
## Warning: Coercing text to numeric in E6731 / R6731C5: '1'
## Warning: Coercing text to numeric in E6732 / R6732C5: '1'
## Warning: Coercing text to numeric in E6733 / R6733C5: '1'
## Warning: Coercing text to numeric in E6734 / R6734C5: '1'
## Warning: Coercing text to numeric in E6735 / R6735C5: '1'
## Warning: Coercing text to numeric in E6736 / R6736C5: '1'
## Warning: Coercing text to numeric in E6737 / R6737C5: '1'
## Warning: Coercing text to numeric in E6738 / R6738C5: '1'
## Warning: Coercing text to numeric in E6739 / R6739C5: '1'
## Warning: Coercing text to numeric in E6740 / R6740C5: '2'
## Warning: Coercing text to numeric in E6741 / R6741C5: '2'
## Warning: Coercing text to numeric in E6742 / R6742C5: '2'
## Warning: Coercing text to numeric in E6743 / R6743C5: '2'
## Warning: Coercing text to numeric in E6744 / R6744C5: '2'
## Warning: Coercing text to numeric in E6745 / R6745C5: '2'
## Warning: Coercing text to numeric in E6746 / R6746C5: '2'
## Warning: Coercing text to numeric in E6747 / R6747C5: '2'
## Warning: Coercing text to numeric in E6748 / R6748C5: '2'
## Warning: Coercing text to numeric in E6749 / R6749C5: '2'
## Warning: Coercing text to numeric in E6750 / R6750C5: '2'
## Warning: Coercing text to numeric in E6751 / R6751C5: '2'
## Warning: Coercing text to numeric in E6752 / R6752C5: '1'
## Warning: Coercing text to numeric in E6753 / R6753C5: '1'
## Warning: Coercing text to numeric in E6754 / R6754C5: '1'
## Warning: Coercing text to numeric in E6755 / R6755C5: '1'
## Warning: Coercing text to numeric in E6756 / R6756C5: '1'
## Warning: Coercing text to numeric in E6757 / R6757C5: '1'
## Warning: Coercing text to numeric in E6758 / R6758C5: '1'
## Warning: Coercing text to numeric in E6759 / R6759C5: '1'
## Warning: Coercing text to numeric in E6760 / R6760C5: '1'
## Warning: Coercing text to numeric in E6761 / R6761C5: '1'
## Warning: Coercing text to numeric in E6762 / R6762C5: '1'
## Warning: Coercing text to numeric in E6763 / R6763C5: '1'
## Warning: Coercing text to numeric in E6764 / R6764C5: '1'
## Warning: Coercing text to numeric in E6765 / R6765C5: '1'
## Warning: Coercing text to numeric in E6766 / R6766C5: '1'
## Warning: Coercing text to numeric in E6767 / R6767C5: '1'
## Warning: Coercing text to numeric in E6768 / R6768C5: '1'
## Warning: Coercing text to numeric in E6769 / R6769C5: '1'
## Warning: Coercing text to numeric in E6770 / R6770C5: '1'
## Warning: Coercing text to numeric in E6771 / R6771C5: '1'
## Warning: Coercing text to numeric in E6772 / R6772C5: '1'
## Warning: Coercing text to numeric in E6773 / R6773C5: '1'
## Warning: Coercing text to numeric in E6774 / R6774C5: '1'
## Warning: Coercing text to numeric in E6775 / R6775C5: '1'
## Warning: Coercing text to numeric in E6776 / R6776C5: '2'
## Warning: Coercing text to numeric in E6777 / R6777C5: '2'
## Warning: Coercing text to numeric in E6778 / R6778C5: '2'
## Warning: Coercing text to numeric in E6779 / R6779C5: '2'
## Warning: Coercing text to numeric in E6780 / R6780C5: '2'
## Warning: Coercing text to numeric in E6781 / R6781C5: '2'
## Warning: Coercing text to numeric in E6782 / R6782C5: '2'
## Warning: Coercing text to numeric in E6783 / R6783C5: '2'
## Warning: Coercing text to numeric in E6784 / R6784C5: '2'
## Warning: Coercing text to numeric in E6785 / R6785C5: '2'
## Warning: Coercing text to numeric in E6786 / R6786C5: '2'
## Warning: Coercing text to numeric in E6787 / R6787C5: '2'
## Warning: Coercing text to numeric in E6788 / R6788C5: '2'
## Warning: Coercing text to numeric in E6789 / R6789C5: '2'
## Warning: Coercing text to numeric in E6790 / R6790C5: '2'
## Warning: Coercing text to numeric in E6791 / R6791C5: '2'
## Warning: Coercing text to numeric in E6792 / R6792C5: '2'
## Warning: Coercing text to numeric in E6793 / R6793C5: '2'
## Warning: Coercing text to numeric in E6794 / R6794C5: '2'
## Warning: Coercing text to numeric in E6795 / R6795C5: '2'
## Warning: Coercing text to numeric in E6796 / R6796C5: '2'
## Warning: Coercing text to numeric in E6797 / R6797C5: '2'
## Warning: Coercing text to numeric in E6798 / R6798C5: '2'
## Warning: Coercing text to numeric in E6799 / R6799C5: '2'
## Warning: Coercing text to numeric in E6800 / R6800C5: '1'
## Warning: Coercing text to numeric in E6801 / R6801C5: '1'
## Warning: Coercing text to numeric in E6802 / R6802C5: '1'
## Warning: Coercing text to numeric in E6803 / R6803C5: '1'
## Warning: Coercing text to numeric in E6804 / R6804C5: '1'
## Warning: Coercing text to numeric in E6805 / R6805C5: '1'
## Warning: Coercing text to numeric in E6806 / R6806C5: '2'
## Warning: Coercing text to numeric in E6807 / R6807C5: '2'
## Warning: Coercing text to numeric in E6808 / R6808C5: '2'
## Warning: Coercing text to numeric in E6809 / R6809C5: '2'
## Warning: Coercing text to numeric in E6810 / R6810C5: '2'
## Warning: Coercing text to numeric in E6811 / R6811C5: '2'
## Warning: Coercing text to numeric in E6812 / R6812C5: '2'
## Warning: Coercing text to numeric in E6813 / R6813C5: '2'
## Warning: Coercing text to numeric in E6814 / R6814C5: '2'
## Warning: Coercing text to numeric in E6815 / R6815C5: '2'
## Warning: Coercing text to numeric in E6816 / R6816C5: '2'
## Warning: Coercing text to numeric in E6817 / R6817C5: '2'
## Warning: Coercing text to numeric in E6818 / R6818C5: '2'
## Warning: Coercing text to numeric in E6819 / R6819C5: '2'
## Warning: Coercing text to numeric in E6820 / R6820C5: '2'
## Warning: Coercing text to numeric in E6821 / R6821C5: '2'
## Warning: Coercing text to numeric in E6822 / R6822C5: '2'
## Warning: Coercing text to numeric in E6823 / R6823C5: '2'
## Warning: Coercing text to numeric in E6824 / R6824C5: '2'
## Warning: Coercing text to numeric in E6825 / R6825C5: '2'
## Warning: Coercing text to numeric in E6826 / R6826C5: '2'
## Warning: Coercing text to numeric in E6827 / R6827C5: '2'
## Warning: Coercing text to numeric in E6828 / R6828C5: '2'
## Warning: Coercing text to numeric in E6829 / R6829C5: '2'
## Warning: Coercing text to numeric in E6830 / R6830C5: '1'
## Warning: Coercing text to numeric in E6831 / R6831C5: '1'
## Warning: Coercing text to numeric in E6832 / R6832C5: '1'
## Warning: Coercing text to numeric in E6833 / R6833C5: '1'
## Warning: Coercing text to numeric in E6834 / R6834C5: '1'
## Warning: Coercing text to numeric in E6835 / R6835C5: '1'
## Warning: Coercing text to numeric in E6836 / R6836C5: '2'
## Warning: Coercing text to numeric in E6837 / R6837C5: '2'
## Warning: Coercing text to numeric in E6838 / R6838C5: '2'
## Warning: Coercing text to numeric in E6839 / R6839C5: '2'
## Warning: Coercing text to numeric in E6840 / R6840C5: '2'
## Warning: Coercing text to numeric in E6841 / R6841C5: '2'
## Warning: Coercing text to numeric in E6842 / R6842C5: '1'
## Warning: Coercing text to numeric in E6843 / R6843C5: '1'
## Warning: Coercing text to numeric in E6844 / R6844C5: '1'
## Warning: Coercing text to numeric in E6845 / R6845C5: '1'
## Warning: Coercing text to numeric in E6846 / R6846C5: '1'
## Warning: Coercing text to numeric in E6847 / R6847C5: '1'
## Warning: Coercing text to numeric in E6848 / R6848C5: '2'
## Warning: Coercing text to numeric in E6849 / R6849C5: '2'
## Warning: Coercing text to numeric in E6850 / R6850C5: '2'
## Warning: Coercing text to numeric in E6851 / R6851C5: '2'
## Warning: Coercing text to numeric in E6852 / R6852C5: '2'
## Warning: Coercing text to numeric in E6853 / R6853C5: '2'
## Warning: Coercing text to numeric in E6854 / R6854C5: '1'
## Warning: Coercing text to numeric in E6855 / R6855C5: '1'
## Warning: Coercing text to numeric in E6856 / R6856C5: '1'
## Warning: Coercing text to numeric in E6857 / R6857C5: '1'
## Warning: Coercing text to numeric in E6858 / R6858C5: '1'
## Warning: Coercing text to numeric in E6859 / R6859C5: '1'
## Warning: Coercing text to numeric in E6860 / R6860C5: '1'
## Warning: Coercing text to numeric in E6861 / R6861C5: '1'
## Warning: Coercing text to numeric in E6862 / R6862C5: '1'
## Warning: Coercing text to numeric in E6863 / R6863C5: '1'
## Warning: Coercing text to numeric in E6864 / R6864C5: '1'
## Warning: Coercing text to numeric in E6865 / R6865C5: '1'
## Warning: Coercing text to numeric in E6866 / R6866C5: '1'
## Warning: Coercing text to numeric in E6867 / R6867C5: '1'
## Warning: Coercing text to numeric in E6868 / R6868C5: '1'
## Warning: Coercing text to numeric in E6869 / R6869C5: '1'
## Warning: Coercing text to numeric in E6870 / R6870C5: '1'
## Warning: Coercing text to numeric in E6871 / R6871C5: '1'
## Warning: Coercing text to numeric in E6872 / R6872C5: '1'
## Warning: Coercing text to numeric in E6873 / R6873C5: '1'
## Warning: Coercing text to numeric in E6874 / R6874C5: '1'
## Warning: Coercing text to numeric in E6875 / R6875C5: '1'
## Warning: Coercing text to numeric in E6876 / R6876C5: '1'
## Warning: Coercing text to numeric in E6877 / R6877C5: '1'
## Warning: Coercing text to numeric in E6878 / R6878C5: '1'
## Warning: Coercing text to numeric in E6879 / R6879C5: '1'
## Warning: Coercing text to numeric in E6880 / R6880C5: '1'
## Warning: Coercing text to numeric in E6881 / R6881C5: '1'
## Warning: Coercing text to numeric in E6882 / R6882C5: '1'
## Warning: Coercing text to numeric in E6883 / R6883C5: '1'
## Warning: Coercing text to numeric in E6884 / R6884C5: '1'
## Warning: Coercing text to numeric in E6885 / R6885C5: '1'
## Warning: Coercing text to numeric in E6886 / R6886C5: '1'
## Warning: Coercing text to numeric in E6887 / R6887C5: '1'
## Warning: Coercing text to numeric in E6888 / R6888C5: '1'
## Warning: Coercing text to numeric in E6889 / R6889C5: '1'
## Warning: Coercing text to numeric in E6890 / R6890C5: '1'
## Warning: Coercing text to numeric in E6891 / R6891C5: '1'
## Warning: Coercing text to numeric in E6892 / R6892C5: '1'
## Warning: Coercing text to numeric in E6893 / R6893C5: '1'
## Warning: Coercing text to numeric in E6894 / R6894C5: '1'
## Warning: Coercing text to numeric in E6895 / R6895C5: '1'
## Warning: Coercing text to numeric in E6896 / R6896C5: '1'
## Warning: Coercing text to numeric in E6897 / R6897C5: '1'
## Warning: Coercing text to numeric in E6898 / R6898C5: '1'
## Warning: Coercing text to numeric in E6899 / R6899C5: '1'
## Warning: Coercing text to numeric in E6900 / R6900C5: '1'
## Warning: Coercing text to numeric in E6901 / R6901C5: '1'
## Warning: Coercing text to numeric in E6902 / R6902C5: '1'
## Warning: Coercing text to numeric in E6903 / R6903C5: '1'
## Warning: Coercing text to numeric in E6904 / R6904C5: '1'
## Warning: Coercing text to numeric in E6905 / R6905C5: '1'
## Warning: Coercing text to numeric in E6906 / R6906C5: '1'
## Warning: Coercing text to numeric in E6907 / R6907C5: '1'
## Warning: Coercing text to numeric in E6908 / R6908C5: '2'
## Warning: Coercing text to numeric in E6909 / R6909C5: '2'
## Warning: Coercing text to numeric in E6910 / R6910C5: '2'
## Warning: Coercing text to numeric in E6911 / R6911C5: '2'
## Warning: Coercing text to numeric in E6912 / R6912C5: '2'
## Warning: Coercing text to numeric in E6913 / R6913C5: '2'
## Warning: Coercing text to numeric in E6914 / R6914C5: '2'
## Warning: Coercing text to numeric in E6915 / R6915C5: '2'
## Warning: Coercing text to numeric in E6916 / R6916C5: '2'
## Warning: Coercing text to numeric in E6917 / R6917C5: '2'
## Warning: Coercing text to numeric in E6918 / R6918C5: '2'
## Warning: Coercing text to numeric in E6919 / R6919C5: '2'
## Warning: Coercing text to numeric in E6920 / R6920C5: '1'
## Warning: Coercing text to numeric in E6921 / R6921C5: '1'
## Warning: Coercing text to numeric in E6922 / R6922C5: '1'
## Warning: Coercing text to numeric in E6923 / R6923C5: '1'
## Warning: Coercing text to numeric in E6924 / R6924C5: '1'
## Warning: Coercing text to numeric in E6925 / R6925C5: '1'
## Warning: Coercing text to numeric in E6926 / R6926C5: '2'
## Warning: Coercing text to numeric in E6927 / R6927C5: '2'
## Warning: Coercing text to numeric in E6928 / R6928C5: '2'
## Warning: Coercing text to numeric in E6929 / R6929C5: '2'
## Warning: Coercing text to numeric in E6930 / R6930C5: '2'
## Warning: Coercing text to numeric in E6931 / R6931C5: '2'
## Warning: Coercing text to numeric in E6932 / R6932C5: '1'
## Warning: Coercing text to numeric in E6933 / R6933C5: '1'
## Warning: Coercing text to numeric in E6934 / R6934C5: '1'
## Warning: Coercing text to numeric in E6935 / R6935C5: '1'
## Warning: Coercing text to numeric in E6936 / R6936C5: '1'
## Warning: Coercing text to numeric in E6937 / R6937C5: '1'
## Warning: Coercing text to numeric in E6938 / R6938C5: '2'
## Warning: Coercing text to numeric in E6939 / R6939C5: '2'
## Warning: Coercing text to numeric in E6940 / R6940C5: '2'
## Warning: Coercing text to numeric in E6941 / R6941C5: '2'
## Warning: Coercing text to numeric in E6942 / R6942C5: '2'
## Warning: Coercing text to numeric in E6943 / R6943C5: '2'
## Warning: Coercing text to numeric in E6944 / R6944C5: '1'
## Warning: Coercing text to numeric in E6945 / R6945C5: '1'
## Warning: Coercing text to numeric in E6946 / R6946C5: '1'
## Warning: Coercing text to numeric in E6947 / R6947C5: '1'
## Warning: Coercing text to numeric in E6948 / R6948C5: '1'
## Warning: Coercing text to numeric in E6949 / R6949C5: '1'
## Warning: Coercing text to numeric in E6950 / R6950C5: '1'
## Warning: Coercing text to numeric in E6951 / R6951C5: '1'
## Warning: Coercing text to numeric in E6952 / R6952C5: '1'
## Warning: Coercing text to numeric in E6953 / R6953C5: '1'
## Warning: Coercing text to numeric in E6954 / R6954C5: '1'
## Warning: Coercing text to numeric in E6955 / R6955C5: '1'
## Warning: Coercing text to numeric in E6956 / R6956C5: '2'
## Warning: Coercing text to numeric in E6957 / R6957C5: '2'
## Warning: Coercing text to numeric in E6958 / R6958C5: '2'
## Warning: Coercing text to numeric in E6959 / R6959C5: '2'
## Warning: Coercing text to numeric in E6960 / R6960C5: '2'
## Warning: Coercing text to numeric in E6961 / R6961C5: '2'
## Warning: Coercing text to numeric in E6962 / R6962C5: '1'
## Warning: Coercing text to numeric in E6963 / R6963C5: '1'
## Warning: Coercing text to numeric in E6964 / R6964C5: '1'
## Warning: Coercing text to numeric in E6965 / R6965C5: '1'
## Warning: Coercing text to numeric in E6966 / R6966C5: '1'
## Warning: Coercing text to numeric in E6967 / R6967C5: '1'
## Warning: Coercing text to numeric in E6968 / R6968C5: '1'
## Warning: Coercing text to numeric in E6969 / R6969C5: '1'
## Warning: Coercing text to numeric in E6970 / R6970C5: '1'
## Warning: Coercing text to numeric in E6971 / R6971C5: '1'
## Warning: Coercing text to numeric in E6972 / R6972C5: '1'
## Warning: Coercing text to numeric in E6973 / R6973C5: '1'
## Warning: Coercing text to numeric in E6974 / R6974C5: '1'
## Warning: Coercing text to numeric in E6975 / R6975C5: '1'
## Warning: Coercing text to numeric in E6976 / R6976C5: '1'
## Warning: Coercing text to numeric in E6977 / R6977C5: '1'
## Warning: Coercing text to numeric in E6978 / R6978C5: '1'
## Warning: Coercing text to numeric in E6979 / R6979C5: '1'
## Warning: Coercing text to numeric in E6980 / R6980C5: '1'
## Warning: Coercing text to numeric in E6981 / R6981C5: '1'
## Warning: Coercing text to numeric in E6982 / R6982C5: '1'
## Warning: Coercing text to numeric in E6983 / R6983C5: '1'
## Warning: Coercing text to numeric in E6984 / R6984C5: '1'
## Warning: Coercing text to numeric in E6985 / R6985C5: '1'
## Warning: Coercing text to numeric in E6986 / R6986C5: '1'
## Warning: Coercing text to numeric in E6987 / R6987C5: '1'
## Warning: Coercing text to numeric in E6988 / R6988C5: '1'
## Warning: Coercing text to numeric in E6989 / R6989C5: '1'
## Warning: Coercing text to numeric in E6990 / R6990C5: '1'
## Warning: Coercing text to numeric in E6991 / R6991C5: '1'
## Warning: Coercing text to numeric in E6992 / R6992C5: '1'
## Warning: Coercing text to numeric in E6993 / R6993C5: '1'
## Warning: Coercing text to numeric in E6994 / R6994C5: '1'
## Warning: Coercing text to numeric in E6995 / R6995C5: '1'
## Warning: Coercing text to numeric in E6996 / R6996C5: '1'
## Warning: Coercing text to numeric in E6997 / R6997C5: '1'
## Warning: Coercing text to numeric in E6998 / R6998C5: '1'
## Warning: Coercing text to numeric in E6999 / R6999C5: '1'
## Warning: Coercing text to numeric in E7000 / R7000C5: '1'
## Warning: Coercing text to numeric in E7001 / R7001C5: '1'
## Warning: Coercing text to numeric in E7002 / R7002C5: '1'
## Warning: Coercing text to numeric in E7003 / R7003C5: '1'
## Warning: Coercing text to numeric in E7004 / R7004C5: '1'
## Warning: Coercing text to numeric in E7005 / R7005C5: '1'
## Warning: Coercing text to numeric in E7006 / R7006C5: '1'
## Warning: Coercing text to numeric in E7007 / R7007C5: '1'
## Warning: Coercing text to numeric in E7008 / R7008C5: '1'
## Warning: Coercing text to numeric in E7009 / R7009C5: '1'
## Warning: Coercing text to numeric in E7010 / R7010C5: '1'
## Warning: Coercing text to numeric in E7011 / R7011C5: '1'
## Warning: Coercing text to numeric in E7012 / R7012C5: '1'
## Warning: Coercing text to numeric in E7013 / R7013C5: '1'
## Warning: Coercing text to numeric in E7014 / R7014C5: '1'
## Warning: Coercing text to numeric in E7015 / R7015C5: '1'
## Warning: Coercing text to numeric in E7016 / R7016C5: '2'
## Warning: Coercing text to numeric in E7017 / R7017C5: '2'
## Warning: Coercing text to numeric in E7018 / R7018C5: '2'
## Warning: Coercing text to numeric in E7019 / R7019C5: '2'
## Warning: Coercing text to numeric in E7020 / R7020C5: '2'
## Warning: Coercing text to numeric in E7021 / R7021C5: '2'
## Warning: Coercing text to numeric in E7022 / R7022C5: '2'
## Warning: Coercing text to numeric in E7023 / R7023C5: '2'
## Warning: Coercing text to numeric in E7024 / R7024C5: '2'
## Warning: Coercing text to numeric in E7025 / R7025C5: '2'
## Warning: Coercing text to numeric in E7026 / R7026C5: '2'
## Warning: Coercing text to numeric in E7027 / R7027C5: '2'
## Warning: Coercing text to numeric in E7028 / R7028C5: '1'
## Warning: Coercing text to numeric in E7029 / R7029C5: '1'
## Warning: Coercing text to numeric in E7030 / R7030C5: '1'
## Warning: Coercing text to numeric in E7031 / R7031C5: '1'
## Warning: Coercing text to numeric in E7032 / R7032C5: '1'
## Warning: Coercing text to numeric in E7033 / R7033C5: '1'
## Warning: Coercing text to numeric in E7034 / R7034C5: '1'
## Warning: Coercing text to numeric in E7035 / R7035C5: '1'
## Warning: Coercing text to numeric in E7036 / R7036C5: '1'
## Warning: Coercing text to numeric in E7037 / R7037C5: '1'
## Warning: Coercing text to numeric in E7038 / R7038C5: '1'
## Warning: Coercing text to numeric in E7039 / R7039C5: '1'
## Warning: Coercing text to numeric in E7040 / R7040C5: '2'
## Warning: Coercing text to numeric in E7041 / R7041C5: '2'
## Warning: Coercing text to numeric in E7042 / R7042C5: '2'
## Warning: Coercing text to numeric in E7043 / R7043C5: '2'
## Warning: Coercing text to numeric in E7044 / R7044C5: '2'
## Warning: Coercing text to numeric in E7045 / R7045C5: '2'
## Warning: Coercing text to numeric in E7046 / R7046C5: '2'
## Warning: Coercing text to numeric in E7047 / R7047C5: '2'
## Warning: Coercing text to numeric in E7048 / R7048C5: '2'
## Warning: Coercing text to numeric in E7049 / R7049C5: '2'
## Warning: Coercing text to numeric in E7050 / R7050C5: '2'
## Warning: Coercing text to numeric in E7051 / R7051C5: '2'
## Warning: Coercing text to numeric in E7052 / R7052C5: '1'
## Warning: Coercing text to numeric in E7053 / R7053C5: '1'
## Warning: Coercing text to numeric in E7054 / R7054C5: '1'
## Warning: Coercing text to numeric in E7055 / R7055C5: '1'
## Warning: Coercing text to numeric in E7056 / R7056C5: '1'
## Warning: Coercing text to numeric in E7057 / R7057C5: '1'
## Warning: Coercing text to numeric in E7058 / R7058C5: '1'
## Warning: Coercing text to numeric in E7059 / R7059C5: '1'
## Warning: Coercing text to numeric in E7060 / R7060C5: '1'
## Warning: Coercing text to numeric in E7061 / R7061C5: '1'
## Warning: Coercing text to numeric in E7062 / R7062C5: '1'
## Warning: Coercing text to numeric in E7063 / R7063C5: '1'
## Warning: Coercing text to numeric in E7064 / R7064C5: '2'
## Warning: Coercing text to numeric in E7065 / R7065C5: '2'
## Warning: Coercing text to numeric in E7066 / R7066C5: '2'
## Warning: Coercing text to numeric in E7067 / R7067C5: '2'
## Warning: Coercing text to numeric in E7068 / R7068C5: '2'
## Warning: Coercing text to numeric in E7069 / R7069C5: '2'
## Warning: Coercing text to numeric in E7070 / R7070C5: '2'
## Warning: Coercing text to numeric in E7071 / R7071C5: '2'
## Warning: Coercing text to numeric in E7072 / R7072C5: '2'
## Warning: Coercing text to numeric in E7073 / R7073C5: '2'
## Warning: Coercing text to numeric in E7074 / R7074C5: '2'
## Warning: Coercing text to numeric in E7075 / R7075C5: '2'
## Warning: Coercing text to numeric in E7076 / R7076C5: '1'
## Warning: Coercing text to numeric in E7077 / R7077C5: '1'
## Warning: Coercing text to numeric in E7078 / R7078C5: '1'
## Warning: Coercing text to numeric in E7079 / R7079C5: '1'
## Warning: Coercing text to numeric in E7080 / R7080C5: '1'
## Warning: Coercing text to numeric in E7081 / R7081C5: '1'
## Warning: Coercing text to numeric in E7082 / R7082C5: '1'
## Warning: Coercing text to numeric in E7083 / R7083C5: '1'
## Warning: Coercing text to numeric in E7084 / R7084C5: '1'
## Warning: Coercing text to numeric in E7085 / R7085C5: '1'
## Warning: Coercing text to numeric in E7086 / R7086C5: '1'
## Warning: Coercing text to numeric in E7087 / R7087C5: '1'
## Warning: Coercing text to numeric in E7088 / R7088C5: '1'
## Warning: Coercing text to numeric in E7089 / R7089C5: '1'
## Warning: Coercing text to numeric in E7090 / R7090C5: '1'
## Warning: Coercing text to numeric in E7091 / R7091C5: '1'
## Warning: Coercing text to numeric in E7092 / R7092C5: '1'
## Warning: Coercing text to numeric in E7093 / R7093C5: '1'
## Warning: Coercing text to numeric in E7094 / R7094C5: '1'
## Warning: Coercing text to numeric in E7095 / R7095C5: '1'
## Warning: Coercing text to numeric in E7096 / R7096C5: '1'
## Warning: Coercing text to numeric in E7097 / R7097C5: '1'
## Warning: Coercing text to numeric in E7098 / R7098C5: '1'
## Warning: Coercing text to numeric in E7099 / R7099C5: '1'
## Warning: Coercing text to numeric in E7100 / R7100C5: '1'
## Warning: Coercing text to numeric in E7101 / R7101C5: '1'
## Warning: Coercing text to numeric in E7102 / R7102C5: '1'
## Warning: Coercing text to numeric in E7103 / R7103C5: '1'
## Warning: Coercing text to numeric in E7104 / R7104C5: '1'
## Warning: Coercing text to numeric in E7105 / R7105C5: '1'
## Warning: Coercing text to numeric in E7106 / R7106C5: '1'
## Warning: Coercing text to numeric in E7107 / R7107C5: '1'
## Warning: Coercing text to numeric in E7108 / R7108C5: '1'
## Warning: Coercing text to numeric in E7109 / R7109C5: '1'
## Warning: Coercing text to numeric in E7110 / R7110C5: '1'
## Warning: Coercing text to numeric in E7111 / R7111C5: '1'
## Warning: Coercing text to numeric in E7112 / R7112C5: '2'
## Warning: Coercing text to numeric in E7113 / R7113C5: '2'
## Warning: Coercing text to numeric in E7114 / R7114C5: '2'
## Warning: Coercing text to numeric in E7115 / R7115C5: '2'
## Warning: Coercing text to numeric in E7116 / R7116C5: '2'
## Warning: Coercing text to numeric in E7117 / R7117C5: '2'
## Warning: Coercing text to numeric in E7118 / R7118C5: '2'
## Warning: Coercing text to numeric in E7119 / R7119C5: '2'
## Warning: Coercing text to numeric in E7120 / R7120C5: '2'
## Warning: Coercing text to numeric in E7121 / R7121C5: '2'
## Warning: Coercing text to numeric in E7122 / R7122C5: '2'
## Warning: Coercing text to numeric in E7123 / R7123C5: '2'
## Warning: Coercing text to numeric in E7124 / R7124C5: '2'
## Warning: Coercing text to numeric in E7125 / R7125C5: '2'
## Warning: Coercing text to numeric in E7126 / R7126C5: '2'
## Warning: Coercing text to numeric in E7127 / R7127C5: '2'
## Warning: Coercing text to numeric in E7128 / R7128C5: '2'
## Warning: Coercing text to numeric in E7129 / R7129C5: '2'
## Warning: Coercing text to numeric in E7130 / R7130C5: '2'
## Warning: Coercing text to numeric in E7131 / R7131C5: '2'
## Warning: Coercing text to numeric in E7132 / R7132C5: '2'
## Warning: Coercing text to numeric in E7133 / R7133C5: '2'
## Warning: Coercing text to numeric in E7134 / R7134C5: '2'
## Warning: Coercing text to numeric in E7135 / R7135C5: '2'
## Warning: Coercing text to numeric in E7136 / R7136C5: '2'
## Warning: Coercing text to numeric in E7137 / R7137C5: '2'
## Warning: Coercing text to numeric in E7138 / R7138C5: '2'
## Warning: Coercing text to numeric in E7139 / R7139C5: '2'
## Warning: Coercing text to numeric in E7140 / R7140C5: '2'
## Warning: Coercing text to numeric in E7141 / R7141C5: '2'
## Warning: Coercing text to numeric in E7142 / R7142C5: '1'
## Warning: Coercing text to numeric in E7143 / R7143C5: '1'
## Warning: Coercing text to numeric in E7144 / R7144C5: '1'
## Warning: Coercing text to numeric in E7145 / R7145C5: '1'
## Warning: Coercing text to numeric in E7146 / R7146C5: '1'
## Warning: Coercing text to numeric in E7147 / R7147C5: '1'
## Warning: Coercing text to numeric in E7148 / R7148C5: '1'
## Warning: Coercing text to numeric in E7149 / R7149C5: '1'
## Warning: Coercing text to numeric in E7150 / R7150C5: '1'
## Warning: Coercing text to numeric in E7151 / R7151C5: '1'
## Warning: Coercing text to numeric in E7152 / R7152C5: '1'
## Warning: Coercing text to numeric in E7153 / R7153C5: '1'
## Warning: Coercing text to numeric in E7154 / R7154C5: '1'
## Warning: Coercing text to numeric in E7155 / R7155C5: '1'
## Warning: Coercing text to numeric in E7156 / R7156C5: '1'
## Warning: Coercing text to numeric in E7157 / R7157C5: '1'
## Warning: Coercing text to numeric in E7158 / R7158C5: '1'
## Warning: Coercing text to numeric in E7159 / R7159C5: '1'
## Warning: Coercing text to numeric in E7160 / R7160C5: '1'
## Warning: Coercing text to numeric in E7161 / R7161C5: '1'
## Warning: Coercing text to numeric in E7162 / R7162C5: '1'
## Warning: Coercing text to numeric in E7163 / R7163C5: '1'
## Warning: Coercing text to numeric in E7164 / R7164C5: '1'
## Warning: Coercing text to numeric in E7165 / R7165C5: '1'
## Warning: Coercing text to numeric in E7166 / R7166C5: '2'
## Warning: Coercing text to numeric in E7167 / R7167C5: '2'
## Warning: Coercing text to numeric in E7168 / R7168C5: '2'
## Warning: Coercing text to numeric in E7169 / R7169C5: '2'
## Warning: Coercing text to numeric in E7170 / R7170C5: '2'
## Warning: Coercing text to numeric in E7171 / R7171C5: '2'
## Warning: Coercing text to numeric in E7172 / R7172C5: '2'
## Warning: Coercing text to numeric in E7173 / R7173C5: '2'
## Warning: Coercing text to numeric in E7174 / R7174C5: '2'
## Warning: Coercing text to numeric in E7175 / R7175C5: '2'
## Warning: Coercing text to numeric in E7176 / R7176C5: '2'
## Warning: Coercing text to numeric in E7177 / R7177C5: '2'
## Warning: Coercing text to numeric in E7178 / R7178C5: '2'
## Warning: Coercing text to numeric in E7179 / R7179C5: '2'
## Warning: Coercing text to numeric in E7180 / R7180C5: '2'
## Warning: Coercing text to numeric in E7181 / R7181C5: '2'
## Warning: Coercing text to numeric in E7182 / R7182C5: '2'
## Warning: Coercing text to numeric in E7183 / R7183C5: '2'
## Warning: Coercing text to numeric in E7184 / R7184C5: '1'
## Warning: Coercing text to numeric in E7185 / R7185C5: '1'
## Warning: Coercing text to numeric in E7186 / R7186C5: '1'
## Warning: Coercing text to numeric in E7187 / R7187C5: '1'
## Warning: Coercing text to numeric in E7188 / R7188C5: '1'
## Warning: Coercing text to numeric in E7189 / R7189C5: '1'
## Warning: Coercing text to numeric in E7190 / R7190C5: '1'
## Warning: Coercing text to numeric in E7191 / R7191C5: '1'
## Warning: Coercing text to numeric in E7192 / R7192C5: '1'
## Warning: Coercing text to numeric in E7193 / R7193C5: '1'
## Warning: Coercing text to numeric in E7194 / R7194C5: '1'
## Warning: Coercing text to numeric in E7195 / R7195C5: '1'
## Warning: Coercing text to numeric in E7196 / R7196C5: '2'
## Warning: Coercing text to numeric in E7197 / R7197C5: '2'
## Warning: Coercing text to numeric in E7198 / R7198C5: '2'
## Warning: Coercing text to numeric in E7199 / R7199C5: '2'
## Warning: Coercing text to numeric in E7200 / R7200C5: '2'
## Warning: Coercing text to numeric in E7201 / R7201C5: '2'
## Warning: Coercing text to numeric in E7202 / R7202C5: '2'
## Warning: Coercing text to numeric in E7203 / R7203C5: '2'
## Warning: Coercing text to numeric in E7204 / R7204C5: '2'
## Warning: Coercing text to numeric in E7205 / R7205C5: '2'
## Warning: Coercing text to numeric in E7206 / R7206C5: '2'
## Warning: Coercing text to numeric in E7207 / R7207C5: '2'
## Warning: Coercing text to numeric in E7208 / R7208C5: '1'
## Warning: Coercing text to numeric in E7209 / R7209C5: '1'
## Warning: Coercing text to numeric in E7210 / R7210C5: '1'
## Warning: Coercing text to numeric in E7211 / R7211C5: '1'
## Warning: Coercing text to numeric in E7212 / R7212C5: '1'
## Warning: Coercing text to numeric in E7213 / R7213C5: '1'
## Warning: Coercing text to numeric in E7214 / R7214C5: '1'
## Warning: Coercing text to numeric in E7215 / R7215C5: '1'
## Warning: Coercing text to numeric in E7216 / R7216C5: '1'
## Warning: Coercing text to numeric in E7217 / R7217C5: '1'
## Warning: Coercing text to numeric in E7218 / R7218C5: '1'
## Warning: Coercing text to numeric in E7219 / R7219C5: '1'
## Warning: Coercing text to numeric in E7220 / R7220C5: '2'
## Warning: Coercing text to numeric in E7221 / R7221C5: '2'
## Warning: Coercing text to numeric in E7222 / R7222C5: '2'
## Warning: Coercing text to numeric in E7223 / R7223C5: '2'
## Warning: Coercing text to numeric in E7224 / R7224C5: '2'
## Warning: Coercing text to numeric in E7225 / R7225C5: '2'
## Warning: Coercing text to numeric in E7226 / R7226C5: '1'
## Warning: Coercing text to numeric in E7227 / R7227C5: '1'
## Warning: Coercing text to numeric in E7228 / R7228C5: '1'
## Warning: Coercing text to numeric in E7229 / R7229C5: '1'
## Warning: Coercing text to numeric in E7230 / R7230C5: '1'
## Warning: Coercing text to numeric in E7231 / R7231C5: '1'
## Warning: Coercing text to numeric in E7232 / R7232C5: '1'
## Warning: Coercing text to numeric in E7233 / R7233C5: '1'
## Warning: Coercing text to numeric in E7234 / R7234C5: '1'
## Warning: Coercing text to numeric in E7235 / R7235C5: '1'
## Warning: Coercing text to numeric in E7236 / R7236C5: '1'
## Warning: Coercing text to numeric in E7237 / R7237C5: '1'
## Warning: Coercing text to numeric in E7238 / R7238C5: '1'
## Warning: Coercing text to numeric in E7239 / R7239C5: '1'
## Warning: Coercing text to numeric in E7240 / R7240C5: '1'
## Warning: Coercing text to numeric in E7241 / R7241C5: '1'
## Warning: Coercing text to numeric in E7242 / R7242C5: '1'
## Warning: Coercing text to numeric in E7243 / R7243C5: '1'
## Warning: Coercing text to numeric in E7244 / R7244C5: '2'
## Warning: Coercing text to numeric in E7245 / R7245C5: '2'
## Warning: Coercing text to numeric in E7246 / R7246C5: '2'
## Warning: Coercing text to numeric in E7247 / R7247C5: '2'
## Warning: Coercing text to numeric in E7248 / R7248C5: '2'
## Warning: Coercing text to numeric in E7249 / R7249C5: '2'
## Warning: Coercing text to numeric in E7250 / R7250C5: '2'
## Warning: Coercing text to numeric in E7251 / R7251C5: '2'
## Warning: Coercing text to numeric in E7252 / R7252C5: '2'
## Warning: Coercing text to numeric in E7253 / R7253C5: '2'
## Warning: Coercing text to numeric in E7254 / R7254C5: '2'
## Warning: Coercing text to numeric in E7255 / R7255C5: '2'
## Warning: Coercing text to numeric in E7256 / R7256C5: '2'
## Warning: Coercing text to numeric in E7257 / R7257C5: '2'
## Warning: Coercing text to numeric in E7258 / R7258C5: '2'
## Warning: Coercing text to numeric in E7259 / R7259C5: '2'
## Warning: Coercing text to numeric in E7260 / R7260C5: '2'
## Warning: Coercing text to numeric in E7261 / R7261C5: '2'
## Warning: Coercing text to numeric in E7262 / R7262C5: '2'
## Warning: Coercing text to numeric in E7263 / R7263C5: '2'
## Warning: Coercing text to numeric in E7264 / R7264C5: '2'
## Warning: Coercing text to numeric in E7265 / R7265C5: '2'
## Warning: Coercing text to numeric in E7266 / R7266C5: '2'
## Warning: Coercing text to numeric in E7267 / R7267C5: '2'
## Warning: Coercing text to numeric in E7268 / R7268C5: '2'
## Warning: Coercing text to numeric in E7269 / R7269C5: '2'
## Warning: Coercing text to numeric in E7270 / R7270C5: '2'
## Warning: Coercing text to numeric in E7271 / R7271C5: '2'
## Warning: Coercing text to numeric in E7272 / R7272C5: '2'
## Warning: Coercing text to numeric in E7273 / R7273C5: '2'
## Warning: Coercing text to numeric in E7274 / R7274C5: '2'
## Warning: Coercing text to numeric in E7275 / R7275C5: '2'
## Warning: Coercing text to numeric in E7276 / R7276C5: '2'
## Warning: Coercing text to numeric in E7277 / R7277C5: '2'
## Warning: Coercing text to numeric in E7278 / R7278C5: '2'
## Warning: Coercing text to numeric in E7279 / R7279C5: '2'
## Warning: Coercing text to numeric in E7280 / R7280C5: '2'
## Warning: Coercing text to numeric in E7281 / R7281C5: '2'
## Warning: Coercing text to numeric in E7282 / R7282C5: '2'
## Warning: Coercing text to numeric in E7283 / R7283C5: '2'
## Warning: Coercing text to numeric in E7284 / R7284C5: '2'
## Warning: Coercing text to numeric in E7285 / R7285C5: '2'
## Warning: Coercing text to numeric in E7286 / R7286C5: '1'
## Warning: Coercing text to numeric in E7287 / R7287C5: '1'
## Warning: Coercing text to numeric in E7288 / R7288C5: '1'
## Warning: Coercing text to numeric in E7289 / R7289C5: '1'
## Warning: Coercing text to numeric in E7290 / R7290C5: '1'
## Warning: Coercing text to numeric in E7291 / R7291C5: '1'
## Warning: Coercing text to numeric in E7292 / R7292C5: '1'
## Warning: Coercing text to numeric in E7293 / R7293C5: '1'
## Warning: Coercing text to numeric in E7294 / R7294C5: '1'
## Warning: Coercing text to numeric in E7295 / R7295C5: '1'
## Warning: Coercing text to numeric in E7296 / R7296C5: '1'
## Warning: Coercing text to numeric in E7297 / R7297C5: '1'
## Warning: Coercing text to numeric in E7298 / R7298C5: '1'
## Warning: Coercing text to numeric in E7299 / R7299C5: '1'
## Warning: Coercing text to numeric in E7300 / R7300C5: '1'
## Warning: Coercing text to numeric in E7301 / R7301C5: '1'
## Warning: Coercing text to numeric in E7302 / R7302C5: '1'
## Warning: Coercing text to numeric in E7303 / R7303C5: '1'
## Warning: Coercing text to numeric in E7304 / R7304C5: '1'
## Warning: Coercing text to numeric in E7305 / R7305C5: '1'
## Warning: Coercing text to numeric in E7306 / R7306C5: '1'
## Warning: Coercing text to numeric in E7307 / R7307C5: '1'
## Warning: Coercing text to numeric in E7308 / R7308C5: '1'
## Warning: Coercing text to numeric in E7309 / R7309C5: '1'
## Warning: Coercing text to numeric in E7310 / R7310C5: '1'
## Warning: Coercing text to numeric in E7311 / R7311C5: '1'
## Warning: Coercing text to numeric in E7312 / R7312C5: '1'
## Warning: Coercing text to numeric in E7313 / R7313C5: '1'
## Warning: Coercing text to numeric in E7314 / R7314C5: '1'
## Warning: Coercing text to numeric in E7315 / R7315C5: '1'
## Warning: Coercing text to numeric in E7316 / R7316C5: '1'
## Warning: Coercing text to numeric in E7317 / R7317C5: '1'
## Warning: Coercing text to numeric in E7318 / R7318C5: '1'
## Warning: Coercing text to numeric in E7319 / R7319C5: '1'
## Warning: Coercing text to numeric in E7320 / R7320C5: '1'
## Warning: Coercing text to numeric in E7321 / R7321C5: '1'
## Warning: Coercing text to numeric in E7322 / R7322C5: '1'
## Warning: Coercing text to numeric in E7323 / R7323C5: '1'
## Warning: Coercing text to numeric in E7324 / R7324C5: '1'
## Warning: Coercing text to numeric in E7325 / R7325C5: '1'
## Warning: Coercing text to numeric in E7326 / R7326C5: '1'
## Warning: Coercing text to numeric in E7327 / R7327C5: '1'
## Warning: Coercing text to numeric in E7328 / R7328C5: '2'
## Warning: Coercing text to numeric in E7329 / R7329C5: '2'
## Warning: Coercing text to numeric in E7330 / R7330C5: '2'
## Warning: Coercing text to numeric in E7331 / R7331C5: '2'
## Warning: Coercing text to numeric in E7332 / R7332C5: '2'
## Warning: Coercing text to numeric in E7333 / R7333C5: '2'
## Warning: Coercing text to numeric in E7334 / R7334C5: '2'
## Warning: Coercing text to numeric in E7335 / R7335C5: '2'
## Warning: Coercing text to numeric in E7336 / R7336C5: '2'
## Warning: Coercing text to numeric in E7337 / R7337C5: '2'
## Warning: Coercing text to numeric in E7338 / R7338C5: '2'
## Warning: Coercing text to numeric in E7339 / R7339C5: '2'
## Warning: Coercing text to numeric in E7340 / R7340C5: '2'
## Warning: Coercing text to numeric in E7341 / R7341C5: '2'
## Warning: Coercing text to numeric in E7342 / R7342C5: '2'
## Warning: Coercing text to numeric in E7343 / R7343C5: '2'
## Warning: Coercing text to numeric in E7344 / R7344C5: '2'
## Warning: Coercing text to numeric in E7345 / R7345C5: '2'
## Warning: Coercing text to numeric in E7346 / R7346C5: '1'
## Warning: Coercing text to numeric in E7347 / R7347C5: '1'
## Warning: Coercing text to numeric in E7348 / R7348C5: '1'
## Warning: Coercing text to numeric in E7349 / R7349C5: '1'
## Warning: Coercing text to numeric in E7350 / R7350C5: '1'
## Warning: Coercing text to numeric in E7351 / R7351C5: '1'
## Warning: Coercing text to numeric in E7352 / R7352C5: '2'
## Warning: Coercing text to numeric in E7353 / R7353C5: '2'
## Warning: Coercing text to numeric in E7354 / R7354C5: '2'
## Warning: Coercing text to numeric in E7355 / R7355C5: '2'
## Warning: Coercing text to numeric in E7356 / R7356C5: '2'
## Warning: Coercing text to numeric in E7357 / R7357C5: '2'
## Warning: Coercing text to numeric in E7358 / R7358C5: '1'
## Warning: Coercing text to numeric in E7359 / R7359C5: '1'
## Warning: Coercing text to numeric in E7360 / R7360C5: '1'
## Warning: Coercing text to numeric in E7361 / R7361C5: '1'
## Warning: Coercing text to numeric in E7362 / R7362C5: '1'
## Warning: Coercing text to numeric in E7363 / R7363C5: '1'
## Warning: Coercing text to numeric in E7364 / R7364C5: '1'
## Warning: Coercing text to numeric in E7365 / R7365C5: '1'
## Warning: Coercing text to numeric in E7366 / R7366C5: '1'
## Warning: Coercing text to numeric in E7367 / R7367C5: '1'
## Warning: Coercing text to numeric in E7368 / R7368C5: '1'
## Warning: Coercing text to numeric in E7369 / R7369C5: '1'
## Warning: Coercing text to numeric in E7370 / R7370C5: '2'
## Warning: Coercing text to numeric in E7371 / R7371C5: '2'
## Warning: Coercing text to numeric in E7372 / R7372C5: '2'
## Warning: Coercing text to numeric in E7373 / R7373C5: '2'
## Warning: Coercing text to numeric in E7374 / R7374C5: '2'
## Warning: Coercing text to numeric in E7375 / R7375C5: '2'
## Warning: Coercing text to numeric in E7376 / R7376C5: '1'
## Warning: Coercing text to numeric in E7377 / R7377C5: '1'
## Warning: Coercing text to numeric in E7378 / R7378C5: '1'
## Warning: Coercing text to numeric in E7379 / R7379C5: '1'
## Warning: Coercing text to numeric in E7380 / R7380C5: '1'
## Warning: Coercing text to numeric in E7381 / R7381C5: '1'
## Warning: Coercing text to numeric in E7382 / R7382C5: '2'
## Warning: Coercing text to numeric in E7383 / R7383C5: '2'
## Warning: Coercing text to numeric in E7384 / R7384C5: '2'
## Warning: Coercing text to numeric in E7385 / R7385C5: '2'
## Warning: Coercing text to numeric in E7386 / R7386C5: '2'
## Warning: Coercing text to numeric in E7387 / R7387C5: '2'
## Warning: Coercing text to numeric in E7388 / R7388C5: '2'
## Warning: Coercing text to numeric in E7389 / R7389C5: '2'
## Warning: Coercing text to numeric in E7390 / R7390C5: '2'
## Warning: Coercing text to numeric in E7391 / R7391C5: '2'
## Warning: Coercing text to numeric in E7392 / R7392C5: '2'
## Warning: Coercing text to numeric in E7393 / R7393C5: '2'
## Warning: Coercing text to numeric in E7394 / R7394C5: '1'
## Warning: Coercing text to numeric in E7395 / R7395C5: '1'
## Warning: Coercing text to numeric in E7396 / R7396C5: '1'
## Warning: Coercing text to numeric in E7397 / R7397C5: '1'
## Warning: Coercing text to numeric in E7398 / R7398C5: '1'
## Warning: Coercing text to numeric in E7399 / R7399C5: '1'
## Warning: Coercing text to numeric in E7400 / R7400C5: '2'
## Warning: Coercing text to numeric in E7401 / R7401C5: '2'
## Warning: Coercing text to numeric in E7402 / R7402C5: '2'
## Warning: Coercing text to numeric in E7403 / R7403C5: '2'
## Warning: Coercing text to numeric in E7404 / R7404C5: '2'
## Warning: Coercing text to numeric in E7405 / R7405C5: '2'
## Warning: Coercing text to numeric in E7406 / R7406C5: '1'
## Warning: Coercing text to numeric in E7407 / R7407C5: '1'
## Warning: Coercing text to numeric in E7408 / R7408C5: '1'
## Warning: Coercing text to numeric in E7409 / R7409C5: '1'
## Warning: Coercing text to numeric in E7410 / R7410C5: '1'
## Warning: Coercing text to numeric in E7411 / R7411C5: '1'
## Warning: Coercing text to numeric in E7412 / R7412C5: '1'
## Warning: Coercing text to numeric in E7413 / R7413C5: '1'
## Warning: Coercing text to numeric in E7414 / R7414C5: '1'
## Warning: Coercing text to numeric in E7415 / R7415C5: '1'
## Warning: Coercing text to numeric in E7416 / R7416C5: '1'
## Warning: Coercing text to numeric in E7417 / R7417C5: '1'
## Warning: Coercing text to numeric in E7418 / R7418C5: '1'
## Warning: Coercing text to numeric in E7419 / R7419C5: '1'
## Warning: Coercing text to numeric in E7420 / R7420C5: '1'
## Warning: Coercing text to numeric in E7421 / R7421C5: '1'
## Warning: Coercing text to numeric in E7422 / R7422C5: '1'
## Warning: Coercing text to numeric in E7423 / R7423C5: '1'
## Warning: Coercing text to numeric in E7424 / R7424C5: '2'
## Warning: Coercing text to numeric in E7425 / R7425C5: '2'
## Warning: Coercing text to numeric in E7426 / R7426C5: '2'
## Warning: Coercing text to numeric in E7427 / R7427C5: '2'
## Warning: Coercing text to numeric in E7428 / R7428C5: '2'
## Warning: Coercing text to numeric in E7429 / R7429C5: '2'
## Warning: Coercing text to numeric in E7430 / R7430C5: '2'
## Warning: Coercing text to numeric in E7431 / R7431C5: '2'
## Warning: Coercing text to numeric in E7432 / R7432C5: '2'
## Warning: Coercing text to numeric in E7433 / R7433C5: '2'
## Warning: Coercing text to numeric in E7434 / R7434C5: '2'
## Warning: Coercing text to numeric in E7435 / R7435C5: '2'
## Warning: Coercing text to numeric in E7436 / R7436C5: '1'
## Warning: Coercing text to numeric in E7437 / R7437C5: '1'
## Warning: Coercing text to numeric in E7438 / R7438C5: '1'
## Warning: Coercing text to numeric in E7439 / R7439C5: '1'
## Warning: Coercing text to numeric in E7440 / R7440C5: '1'
## Warning: Coercing text to numeric in E7441 / R7441C5: '1'
## Warning: Coercing text to numeric in E7442 / R7442C5: '2'
## Warning: Coercing text to numeric in E7443 / R7443C5: '2'
## Warning: Coercing text to numeric in E7444 / R7444C5: '2'
## Warning: Coercing text to numeric in E7445 / R7445C5: '2'
## Warning: Coercing text to numeric in E7446 / R7446C5: '2'
## Warning: Coercing text to numeric in E7447 / R7447C5: '2'
## Warning: Coercing text to numeric in E7448 / R7448C5: '2'
## Warning: Coercing text to numeric in E7449 / R7449C5: '2'
## Warning: Coercing text to numeric in E7450 / R7450C5: '2'
## Warning: Coercing text to numeric in E7451 / R7451C5: '2'
## Warning: Coercing text to numeric in E7452 / R7452C5: '2'
## Warning: Coercing text to numeric in E7453 / R7453C5: '2'
## Warning: Coercing text to numeric in E7454 / R7454C5: '1'
## Warning: Coercing text to numeric in E7455 / R7455C5: '1'
## Warning: Coercing text to numeric in E7456 / R7456C5: '1'
## Warning: Coercing text to numeric in E7457 / R7457C5: '1'
## Warning: Coercing text to numeric in E7458 / R7458C5: '1'
## Warning: Coercing text to numeric in E7459 / R7459C5: '1'
## Warning: Coercing text to numeric in E7460 / R7460C5: '1'
## Warning: Coercing text to numeric in E7461 / R7461C5: '1'
## Warning: Coercing text to numeric in E7462 / R7462C5: '1'
## Warning: Coercing text to numeric in E7463 / R7463C5: '1'
## Warning: Coercing text to numeric in E7464 / R7464C5: '1'
## Warning: Coercing text to numeric in E7465 / R7465C5: '1'
## Warning: Coercing text to numeric in E7466 / R7466C5: '2'
## Warning: Coercing text to numeric in E7467 / R7467C5: '2'
## Warning: Coercing text to numeric in E7468 / R7468C5: '2'
## Warning: Coercing text to numeric in E7469 / R7469C5: '2'
## Warning: Coercing text to numeric in E7470 / R7470C5: '2'
## Warning: Coercing text to numeric in E7471 / R7471C5: '2'
## Warning: Coercing text to numeric in E7472 / R7472C5: '2'
## Warning: Coercing text to numeric in E7473 / R7473C5: '2'
## Warning: Coercing text to numeric in E7474 / R7474C5: '2'
## Warning: Coercing text to numeric in E7475 / R7475C5: '2'
## Warning: Coercing text to numeric in E7476 / R7476C5: '2'
## Warning: Coercing text to numeric in E7477 / R7477C5: '2'
## Warning: Coercing text to numeric in E7478 / R7478C5: '1'
## Warning: Coercing text to numeric in E7479 / R7479C5: '1'
## Warning: Coercing text to numeric in E7480 / R7480C5: '1'
## Warning: Coercing text to numeric in E7481 / R7481C5: '1'
## Warning: Coercing text to numeric in E7482 / R7482C5: '1'
## Warning: Coercing text to numeric in E7483 / R7483C5: '1'
## Warning: Coercing text to numeric in E7484 / R7484C5: '2'
## Warning: Coercing text to numeric in E7485 / R7485C5: '2'
## Warning: Coercing text to numeric in E7486 / R7486C5: '2'
## Warning: Coercing text to numeric in E7487 / R7487C5: '2'
## Warning: Coercing text to numeric in E7488 / R7488C5: '2'
## Warning: Coercing text to numeric in E7489 / R7489C5: '2'
## Warning: Coercing text to numeric in E7490 / R7490C5: '1'
## Warning: Coercing text to numeric in E7491 / R7491C5: '1'
## Warning: Coercing text to numeric in E7492 / R7492C5: '1'
## Warning: Coercing text to numeric in E7493 / R7493C5: '1'
## Warning: Coercing text to numeric in E7494 / R7494C5: '1'
## Warning: Coercing text to numeric in E7495 / R7495C5: '1'
## Warning: Coercing text to numeric in E7496 / R7496C5: '2'
## Warning: Coercing text to numeric in E7497 / R7497C5: '2'
## Warning: Coercing text to numeric in E7498 / R7498C5: '2'
## Warning: Coercing text to numeric in E7499 / R7499C5: '2'
## Warning: Coercing text to numeric in E7500 / R7500C5: '2'
## Warning: Coercing text to numeric in E7501 / R7501C5: '2'
## Warning: Coercing text to numeric in E7502 / R7502C5: '2'
## Warning: Coercing text to numeric in E7503 / R7503C5: '2'
## Warning: Coercing text to numeric in E7504 / R7504C5: '2'
## Warning: Coercing text to numeric in E7505 / R7505C5: '2'
## Warning: Coercing text to numeric in E7506 / R7506C5: '2'
## Warning: Coercing text to numeric in E7507 / R7507C5: '2'
## Warning: Coercing text to numeric in E7508 / R7508C5: '1'
## Warning: Coercing text to numeric in E7509 / R7509C5: '1'
## Warning: Coercing text to numeric in E7510 / R7510C5: '1'
## Warning: Coercing text to numeric in E7511 / R7511C5: '1'
## Warning: Coercing text to numeric in E7512 / R7512C5: '1'
## Warning: Coercing text to numeric in E7513 / R7513C5: '1'
## Warning: Coercing text to numeric in E7514 / R7514C5: '2'
## Warning: Coercing text to numeric in E7515 / R7515C5: '2'
## Warning: Coercing text to numeric in E7516 / R7516C5: '2'
## Warning: Coercing text to numeric in E7517 / R7517C5: '2'
## Warning: Coercing text to numeric in E7518 / R7518C5: '2'
## Warning: Coercing text to numeric in E7519 / R7519C5: '2'
## Warning: Coercing text to numeric in E7520 / R7520C5: '2'
## Warning: Coercing text to numeric in E7521 / R7521C5: '2'
## Warning: Coercing text to numeric in E7522 / R7522C5: '2'
## Warning: Coercing text to numeric in E7523 / R7523C5: '2'
## Warning: Coercing text to numeric in E7524 / R7524C5: '2'
## Warning: Coercing text to numeric in E7525 / R7525C5: '2'
## Warning: Coercing text to numeric in E7526 / R7526C5: '2'
## Warning: Coercing text to numeric in E7527 / R7527C5: '2'
## Warning: Coercing text to numeric in E7528 / R7528C5: '2'
## Warning: Coercing text to numeric in E7529 / R7529C5: '2'
## Warning: Coercing text to numeric in E7530 / R7530C5: '2'
## Warning: Coercing text to numeric in E7531 / R7531C5: '2'
## Warning: Coercing text to numeric in E7532 / R7532C5: '2'
## Warning: Coercing text to numeric in E7533 / R7533C5: '2'
## Warning: Coercing text to numeric in E7534 / R7534C5: '2'
## Warning: Coercing text to numeric in E7535 / R7535C5: '2'
## Warning: Coercing text to numeric in E7536 / R7536C5: '2'
## Warning: Coercing text to numeric in E7537 / R7537C5: '2'
## Warning: Coercing text to numeric in E7538 / R7538C5: '1'
## Warning: Coercing text to numeric in E7539 / R7539C5: '1'
## Warning: Coercing text to numeric in E7540 / R7540C5: '1'
## Warning: Coercing text to numeric in E7541 / R7541C5: '1'
## Warning: Coercing text to numeric in E7542 / R7542C5: '1'
## Warning: Coercing text to numeric in E7543 / R7543C5: '1'
## Warning: Coercing text to numeric in E7544 / R7544C5: '2'
## Warning: Coercing text to numeric in E7545 / R7545C5: '2'
## Warning: Coercing text to numeric in E7546 / R7546C5: '2'
## Warning: Coercing text to numeric in E7547 / R7547C5: '2'
## Warning: Coercing text to numeric in E7548 / R7548C5: '2'
## Warning: Coercing text to numeric in E7549 / R7549C5: '2'
## Warning: Coercing text to numeric in E7550 / R7550C5: '1'
## Warning: Coercing text to numeric in E7551 / R7551C5: '1'
## Warning: Coercing text to numeric in E7552 / R7552C5: '1'
## Warning: Coercing text to numeric in E7553 / R7553C5: '1'
## Warning: Coercing text to numeric in E7554 / R7554C5: '1'
## Warning: Coercing text to numeric in E7555 / R7555C5: '1'
## Warning: Coercing text to numeric in E7556 / R7556C5: '1'
## Warning: Coercing text to numeric in E7557 / R7557C5: '1'
## Warning: Coercing text to numeric in E7558 / R7558C5: '1'
## Warning: Coercing text to numeric in E7559 / R7559C5: '1'
## Warning: Coercing text to numeric in E7560 / R7560C5: '1'
## Warning: Coercing text to numeric in E7561 / R7561C5: '1'
## Warning: Coercing text to numeric in E7562 / R7562C5: '2'
## Warning: Coercing text to numeric in E7563 / R7563C5: '2'
## Warning: Coercing text to numeric in E7564 / R7564C5: '2'
## Warning: Coercing text to numeric in E7565 / R7565C5: '2'
## Warning: Coercing text to numeric in E7566 / R7566C5: '2'
## Warning: Coercing text to numeric in E7567 / R7567C5: '2'
## Warning: Coercing text to numeric in E7568 / R7568C5: '2'
## Warning: Coercing text to numeric in E7569 / R7569C5: '2'
## Warning: Coercing text to numeric in E7570 / R7570C5: '2'
## Warning: Coercing text to numeric in E7571 / R7571C5: '2'
## Warning: Coercing text to numeric in E7572 / R7572C5: '2'
## Warning: Coercing text to numeric in E7573 / R7573C5: '2'
## Warning: Coercing text to numeric in E7574 / R7574C5: '2'
## Warning: Coercing text to numeric in E7575 / R7575C5: '2'
## Warning: Coercing text to numeric in E7576 / R7576C5: '2'
## Warning: Coercing text to numeric in E7577 / R7577C5: '2'
## Warning: Coercing text to numeric in E7578 / R7578C5: '2'
## Warning: Coercing text to numeric in E7579 / R7579C5: '2'
## Warning: Coercing text to numeric in E7580 / R7580C5: '1'
## Warning: Coercing text to numeric in E7581 / R7581C5: '1'
## Warning: Coercing text to numeric in E7582 / R7582C5: '1'
## Warning: Coercing text to numeric in E7583 / R7583C5: '1'
## Warning: Coercing text to numeric in E7584 / R7584C5: '1'
## Warning: Coercing text to numeric in E7585 / R7585C5: '1'
## Warning: Coercing text to numeric in E7586 / R7586C5: '1'
## Warning: Coercing text to numeric in E7587 / R7587C5: '1'
## Warning: Coercing text to numeric in E7588 / R7588C5: '1'
## Warning: Coercing text to numeric in E7589 / R7589C5: '1'
## Warning: Coercing text to numeric in E7590 / R7590C5: '1'
## Warning: Coercing text to numeric in E7591 / R7591C5: '1'
## Warning: Coercing text to numeric in E7592 / R7592C5: '1'
## Warning: Coercing text to numeric in E7593 / R7593C5: '1'
## Warning: Coercing text to numeric in E7594 / R7594C5: '1'
## Warning: Coercing text to numeric in E7595 / R7595C5: '1'
## Warning: Coercing text to numeric in E7596 / R7596C5: '1'
## Warning: Coercing text to numeric in E7597 / R7597C5: '1'
## Warning: Coercing text to numeric in E7598 / R7598C5: '1'
## Warning: Coercing text to numeric in E7599 / R7599C5: '1'
## Warning: Coercing text to numeric in E7600 / R7600C5: '1'
## Warning: Coercing text to numeric in E7601 / R7601C5: '1'
## Warning: Coercing text to numeric in E7602 / R7602C5: '1'
## Warning: Coercing text to numeric in E7603 / R7603C5: '1'
## Warning: Coercing text to numeric in E7604 / R7604C5: '2'
## Warning: Coercing text to numeric in E7605 / R7605C5: '2'
## Warning: Coercing text to numeric in E7606 / R7606C5: '2'
## Warning: Coercing text to numeric in E7607 / R7607C5: '2'
## Warning: Coercing text to numeric in E7608 / R7608C5: '2'
## Warning: Coercing text to numeric in E7609 / R7609C5: '2'
## Warning: Coercing text to numeric in E7610 / R7610C5: '2'
## Warning: Coercing text to numeric in E7611 / R7611C5: '2'
## Warning: Coercing text to numeric in E7612 / R7612C5: '2'
## Warning: Coercing text to numeric in E7613 / R7613C5: '2'
## Warning: Coercing text to numeric in E7614 / R7614C5: '2'
## Warning: Coercing text to numeric in E7615 / R7615C5: '2'
## Warning: Coercing text to numeric in E7616 / R7616C5: '1'
## Warning: Coercing text to numeric in E7617 / R7617C5: '1'
## Warning: Coercing text to numeric in E7618 / R7618C5: '1'
## Warning: Coercing text to numeric in E7619 / R7619C5: '1'
## Warning: Coercing text to numeric in E7620 / R7620C5: '1'
## Warning: Coercing text to numeric in E7621 / R7621C5: '1'
## Warning: Coercing text to numeric in E7622 / R7622C5: '1'
## Warning: Coercing text to numeric in E7623 / R7623C5: '1'
## Warning: Coercing text to numeric in E7624 / R7624C5: '1'
## Warning: Coercing text to numeric in E7625 / R7625C5: '1'
## Warning: Coercing text to numeric in E7626 / R7626C5: '1'
## Warning: Coercing text to numeric in E7627 / R7627C5: '1'
## Warning: Coercing text to numeric in E7628 / R7628C5: '2'
## Warning: Coercing text to numeric in E7629 / R7629C5: '2'
## Warning: Coercing text to numeric in E7630 / R7630C5: '2'
## Warning: Coercing text to numeric in E7631 / R7631C5: '2'
## Warning: Coercing text to numeric in E7632 / R7632C5: '2'
## Warning: Coercing text to numeric in E7633 / R7633C5: '2'
## Warning: Coercing text to numeric in E7634 / R7634C5: '2'
## Warning: Coercing text to numeric in E7635 / R7635C5: '2'
## Warning: Coercing text to numeric in E7636 / R7636C5: '2'
## Warning: Coercing text to numeric in E7637 / R7637C5: '2'
## Warning: Coercing text to numeric in E7638 / R7638C5: '2'
## Warning: Coercing text to numeric in E7639 / R7639C5: '2'
## Warning: Coercing text to numeric in E7640 / R7640C5: '1'
## Warning: Coercing text to numeric in E7641 / R7641C5: '1'
## Warning: Coercing text to numeric in E7642 / R7642C5: '1'
## Warning: Coercing text to numeric in E7643 / R7643C5: '1'
## Warning: Coercing text to numeric in E7644 / R7644C5: '1'
## Warning: Coercing text to numeric in E7645 / R7645C5: '1'
## Warning: Coercing text to numeric in E7646 / R7646C5: '2'
## Warning: Coercing text to numeric in E7647 / R7647C5: '2'
## Warning: Coercing text to numeric in E7648 / R7648C5: '2'
## Warning: Coercing text to numeric in E7649 / R7649C5: '2'
## Warning: Coercing text to numeric in E7650 / R7650C5: '2'
## Warning: Coercing text to numeric in E7651 / R7651C5: '2'
## Warning: Coercing text to numeric in E7652 / R7652C5: '2'
## Warning: Coercing text to numeric in E7653 / R7653C5: '2'
## Warning: Coercing text to numeric in E7654 / R7654C5: '2'
## Warning: Coercing text to numeric in E7655 / R7655C5: '2'
## Warning: Coercing text to numeric in E7656 / R7656C5: '2'
## Warning: Coercing text to numeric in E7657 / R7657C5: '2'
## Warning: Coercing text to numeric in E7658 / R7658C5: '1'
## Warning: Coercing text to numeric in E7659 / R7659C5: '1'
## Warning: Coercing text to numeric in E7660 / R7660C5: '1'
## Warning: Coercing text to numeric in E7661 / R7661C5: '1'
## Warning: Coercing text to numeric in E7662 / R7662C5: '1'
## Warning: Coercing text to numeric in E7663 / R7663C5: '1'
## Warning: Coercing text to numeric in E7664 / R7664C5: '1'
## Warning: Coercing text to numeric in E7665 / R7665C5: '1'
## Warning: Coercing text to numeric in E7666 / R7666C5: '1'
## Warning: Coercing text to numeric in E7667 / R7667C5: '1'
## Warning: Coercing text to numeric in E7668 / R7668C5: '1'
## Warning: Coercing text to numeric in E7669 / R7669C5: '1'
## Warning: Coercing text to numeric in E7670 / R7670C5: '1'
## Warning: Coercing text to numeric in E7671 / R7671C5: '1'
## Warning: Coercing text to numeric in E7672 / R7672C5: '1'
## Warning: Coercing text to numeric in E7673 / R7673C5: '1'
## Warning: Coercing text to numeric in E7674 / R7674C5: '1'
## Warning: Coercing text to numeric in E7675 / R7675C5: '1'
## Warning: Coercing text to numeric in E7676 / R7676C5: '1'
## Warning: Coercing text to numeric in E7677 / R7677C5: '1'
## Warning: Coercing text to numeric in E7678 / R7678C5: '1'
## Warning: Coercing text to numeric in E7679 / R7679C5: '1'
## Warning: Coercing text to numeric in E7680 / R7680C5: '1'
## Warning: Coercing text to numeric in E7681 / R7681C5: '1'
## Warning: Coercing text to numeric in E7682 / R7682C5: '1'
## Warning: Coercing text to numeric in E7683 / R7683C5: '1'
## Warning: Coercing text to numeric in E7684 / R7684C5: '1'
## Warning: Coercing text to numeric in E7685 / R7685C5: '1'
## Warning: Coercing text to numeric in E7686 / R7686C5: '1'
## Warning: Coercing text to numeric in E7687 / R7687C5: '1'
## Warning: Coercing text to numeric in E7688 / R7688C5: '1'
## Warning: Coercing text to numeric in E7689 / R7689C5: '1'
## Warning: Coercing text to numeric in E7690 / R7690C5: '1'
## Warning: Coercing text to numeric in E7691 / R7691C5: '1'
## Warning: Coercing text to numeric in E7692 / R7692C5: '1'
## Warning: Coercing text to numeric in E7693 / R7693C5: '1'
## Warning: Coercing text to numeric in E7694 / R7694C5: '2'
## Warning: Coercing text to numeric in E7695 / R7695C5: '2'
## Warning: Coercing text to numeric in E7696 / R7696C5: '2'
## Warning: Coercing text to numeric in E7697 / R7697C5: '2'
## Warning: Coercing text to numeric in E7698 / R7698C5: '2'
## Warning: Coercing text to numeric in E7699 / R7699C5: '2'
## Warning: Coercing text to numeric in E7700 / R7700C5: '2'
## Warning: Coercing text to numeric in E7701 / R7701C5: '2'
## Warning: Coercing text to numeric in E7702 / R7702C5: '2'
## Warning: Coercing text to numeric in E7703 / R7703C5: '2'
## Warning: Coercing text to numeric in E7704 / R7704C5: '2'
## Warning: Coercing text to numeric in E7705 / R7705C5: '2'
## Warning: Coercing text to numeric in E7706 / R7706C5: '2'
## Warning: Coercing text to numeric in E7707 / R7707C5: '2'
## Warning: Coercing text to numeric in E7708 / R7708C5: '2'
## Warning: Coercing text to numeric in E7709 / R7709C5: '2'
## Warning: Coercing text to numeric in E7710 / R7710C5: '2'
## Warning: Coercing text to numeric in E7711 / R7711C5: '2'
## Warning: Coercing text to numeric in E7712 / R7712C5: '2'
## Warning: Coercing text to numeric in E7713 / R7713C5: '2'
## Warning: Coercing text to numeric in E7714 / R7714C5: '2'
## Warning: Coercing text to numeric in E7715 / R7715C5: '2'
## Warning: Coercing text to numeric in E7716 / R7716C5: '2'
## Warning: Coercing text to numeric in E7717 / R7717C5: '2'
## Warning: Coercing text to numeric in E7718 / R7718C5: '2'
## Warning: Coercing text to numeric in E7719 / R7719C5: '2'
## Warning: Coercing text to numeric in E7720 / R7720C5: '2'
## Warning: Coercing text to numeric in E7721 / R7721C5: '2'
## Warning: Coercing text to numeric in E7722 / R7722C5: '2'
## Warning: Coercing text to numeric in E7723 / R7723C5: '2'
## Warning: Coercing text to numeric in E7724 / R7724C5: '1'
## Warning: Coercing text to numeric in E7725 / R7725C5: '1'
## Warning: Coercing text to numeric in E7726 / R7726C5: '1'
## Warning: Coercing text to numeric in E7727 / R7727C5: '1'
## Warning: Coercing text to numeric in E7728 / R7728C5: '1'
## Warning: Coercing text to numeric in E7729 / R7729C5: '1'
## Warning: Coercing text to numeric in E7730 / R7730C5: '2'
## Warning: Coercing text to numeric in E7731 / R7731C5: '2'
## Warning: Coercing text to numeric in E7732 / R7732C5: '2'
## Warning: Coercing text to numeric in E7733 / R7733C5: '2'
## Warning: Coercing text to numeric in E7734 / R7734C5: '2'
## Warning: Coercing text to numeric in E7735 / R7735C5: '2'
## Warning: Coercing text to numeric in E7736 / R7736C5: '1'
## Warning: Coercing text to numeric in E7737 / R7737C5: '1'
## Warning: Coercing text to numeric in E7738 / R7738C5: '1'
## Warning: Coercing text to numeric in E7739 / R7739C5: '1'
## Warning: Coercing text to numeric in E7740 / R7740C5: '1'
## Warning: Coercing text to numeric in E7741 / R7741C5: '1'
## Warning: Coercing text to numeric in E7742 / R7742C5: '1'
## Warning: Coercing text to numeric in E7743 / R7743C5: '1'
## Warning: Coercing text to numeric in E7744 / R7744C5: '1'
## Warning: Coercing text to numeric in E7745 / R7745C5: '1'
## Warning: Coercing text to numeric in E7746 / R7746C5: '1'
## Warning: Coercing text to numeric in E7747 / R7747C5: '1'
## Warning: Coercing text to numeric in E7748 / R7748C5: '1'
## Warning: Coercing text to numeric in E7749 / R7749C5: '1'
## Warning: Coercing text to numeric in E7750 / R7750C5: '1'
## Warning: Coercing text to numeric in E7751 / R7751C5: '1'
## Warning: Coercing text to numeric in E7752 / R7752C5: '1'
## Warning: Coercing text to numeric in E7753 / R7753C5: '1'
## Warning: Coercing text to numeric in E7754 / R7754C5: '1'
## Warning: Coercing text to numeric in E7755 / R7755C5: '1'
## Warning: Coercing text to numeric in E7756 / R7756C5: '1'
## Warning: Coercing text to numeric in E7757 / R7757C5: '1'
## Warning: Coercing text to numeric in E7758 / R7758C5: '1'
## Warning: Coercing text to numeric in E7759 / R7759C5: '1'
## Warning: Coercing text to numeric in E7760 / R7760C5: '2'
## Warning: Coercing text to numeric in E7761 / R7761C5: '2'
## Warning: Coercing text to numeric in E7762 / R7762C5: '2'
## Warning: Coercing text to numeric in E7763 / R7763C5: '2'
## Warning: Coercing text to numeric in E7764 / R7764C5: '2'
## Warning: Coercing text to numeric in E7765 / R7765C5: '2'
## Warning: Coercing text to numeric in E7766 / R7766C5: '2'
## Warning: Coercing text to numeric in E7767 / R7767C5: '2'
## Warning: Coercing text to numeric in E7768 / R7768C5: '2'
## Warning: Coercing text to numeric in E7769 / R7769C5: '2'
## Warning: Coercing text to numeric in E7770 / R7770C5: '2'
## Warning: Coercing text to numeric in E7771 / R7771C5: '2'
## Warning: Coercing text to numeric in E7772 / R7772C5: '2'
## Warning: Coercing text to numeric in E7773 / R7773C5: '2'
## Warning: Coercing text to numeric in E7774 / R7774C5: '2'
## Warning: Coercing text to numeric in E7775 / R7775C5: '2'
## Warning: Coercing text to numeric in E7776 / R7776C5: '2'
## Warning: Coercing text to numeric in E7777 / R7777C5: '2'
## Warning: Coercing text to numeric in E7778 / R7778C5: '2'
## Warning: Coercing text to numeric in E7779 / R7779C5: '2'
## Warning: Coercing text to numeric in E7780 / R7780C5: '2'
## Warning: Coercing text to numeric in E7781 / R7781C5: '2'
## Warning: Coercing text to numeric in E7782 / R7782C5: '2'
## Warning: Coercing text to numeric in E7783 / R7783C5: '2'
## Warning: Coercing text to numeric in E7784 / R7784C5: '2'
## Warning: Coercing text to numeric in E7785 / R7785C5: '2'
## Warning: Coercing text to numeric in E7786 / R7786C5: '2'
## Warning: Coercing text to numeric in E7787 / R7787C5: '2'
## Warning: Coercing text to numeric in E7788 / R7788C5: '2'
## Warning: Coercing text to numeric in E7789 / R7789C5: '2'
## Warning: Coercing text to numeric in E7790 / R7790C5: '1'
## Warning: Coercing text to numeric in E7791 / R7791C5: '1'
## Warning: Coercing text to numeric in E7792 / R7792C5: '1'
## Warning: Coercing text to numeric in E7793 / R7793C5: '1'
## Warning: Coercing text to numeric in E7794 / R7794C5: '1'
## Warning: Coercing text to numeric in E7795 / R7795C5: '1'
## Warning: Coercing text to numeric in E7796 / R7796C5: '2'
## Warning: Coercing text to numeric in E7797 / R7797C5: '2'
## Warning: Coercing text to numeric in E7798 / R7798C5: '2'
## Warning: Coercing text to numeric in E7799 / R7799C5: '2'
## Warning: Coercing text to numeric in E7800 / R7800C5: '2'
## Warning: Coercing text to numeric in E7801 / R7801C5: '2'
## Warning: Coercing text to numeric in E7802 / R7802C5: '1'
## Warning: Coercing text to numeric in E7803 / R7803C5: '1'
## Warning: Coercing text to numeric in E7804 / R7804C5: '1'
## Warning: Coercing text to numeric in E7805 / R7805C5: '1'
## Warning: Coercing text to numeric in E7806 / R7806C5: '1'
## Warning: Coercing text to numeric in E7807 / R7807C5: '1'
## Warning: Coercing text to numeric in E7808 / R7808C5: '2'
## Warning: Coercing text to numeric in E7809 / R7809C5: '2'
## Warning: Coercing text to numeric in E7810 / R7810C5: '2'
## Warning: Coercing text to numeric in E7811 / R7811C5: '2'
## Warning: Coercing text to numeric in E7812 / R7812C5: '2'
## Warning: Coercing text to numeric in E7813 / R7813C5: '2'
## Warning: Coercing text to numeric in E7814 / R7814C5: '2'
## Warning: Coercing text to numeric in E7815 / R7815C5: '2'
## Warning: Coercing text to numeric in E7816 / R7816C5: '2'
## Warning: Coercing text to numeric in E7817 / R7817C5: '2'
## Warning: Coercing text to numeric in E7818 / R7818C5: '2'
## Warning: Coercing text to numeric in E7819 / R7819C5: '2'
## Warning: Coercing text to numeric in E7820 / R7820C5: '2'
## Warning: Coercing text to numeric in E7821 / R7821C5: '2'
## Warning: Coercing text to numeric in E7822 / R7822C5: '2'
## Warning: Coercing text to numeric in E7823 / R7823C5: '2'
## Warning: Coercing text to numeric in E7824 / R7824C5: '2'
## Warning: Coercing text to numeric in E7825 / R7825C5: '2'
## Warning: Coercing text to numeric in E7826 / R7826C5: '1'
## Warning: Coercing text to numeric in E7827 / R7827C5: '1'
## Warning: Coercing text to numeric in E7828 / R7828C5: '1'
## Warning: Coercing text to numeric in E7829 / R7829C5: '1'
## Warning: Coercing text to numeric in E7830 / R7830C5: '1'
## Warning: Coercing text to numeric in E7831 / R7831C5: '1'
## Warning: Coercing text to numeric in E7832 / R7832C5: '2'
## Warning: Coercing text to numeric in E7833 / R7833C5: '2'
## Warning: Coercing text to numeric in E7834 / R7834C5: '2'
## Warning: Coercing text to numeric in E7835 / R7835C5: '2'
## Warning: Coercing text to numeric in E7836 / R7836C5: '2'
## Warning: Coercing text to numeric in E7837 / R7837C5: '2'
## Warning: Coercing text to numeric in E7838 / R7838C5: '1'
## Warning: Coercing text to numeric in E7839 / R7839C5: '1'
## Warning: Coercing text to numeric in E7840 / R7840C5: '1'
## Warning: Coercing text to numeric in E7841 / R7841C5: '1'
## Warning: Coercing text to numeric in E7842 / R7842C5: '1'
## Warning: Coercing text to numeric in E7843 / R7843C5: '1'
## Warning: Coercing text to numeric in E7844 / R7844C5: '1'
## Warning: Coercing text to numeric in E7845 / R7845C5: '1'
## Warning: Coercing text to numeric in E7846 / R7846C5: '1'
## Warning: Coercing text to numeric in E7847 / R7847C5: '1'
## Warning: Coercing text to numeric in E7848 / R7848C5: '1'
## Warning: Coercing text to numeric in E7849 / R7849C5: '1'
## Warning: Coercing text to numeric in E7850 / R7850C5: '2'
## Warning: Coercing text to numeric in E7851 / R7851C5: '2'
## Warning: Coercing text to numeric in E7852 / R7852C5: '2'
## Warning: Coercing text to numeric in E7853 / R7853C5: '2'
## Warning: Coercing text to numeric in E7854 / R7854C5: '2'
## Warning: Coercing text to numeric in E7855 / R7855C5: '2'
## Warning: Coercing text to numeric in E7856 / R7856C5: '1'
## Warning: Coercing text to numeric in E7857 / R7857C5: '1'
## Warning: Coercing text to numeric in E7858 / R7858C5: '1'
## Warning: Coercing text to numeric in E7859 / R7859C5: '1'
## Warning: Coercing text to numeric in E7860 / R7860C5: '1'
## Warning: Coercing text to numeric in E7861 / R7861C5: '1'
## Warning: Coercing text to numeric in E7862 / R7862C5: '2'
## Warning: Coercing text to numeric in E7863 / R7863C5: '2'
## Warning: Coercing text to numeric in E7864 / R7864C5: '2'
## Warning: Coercing text to numeric in E7865 / R7865C5: '2'
## Warning: Coercing text to numeric in E7866 / R7866C5: '2'
## Warning: Coercing text to numeric in E7867 / R7867C5: '2'
## Warning: Coercing text to numeric in E7868 / R7868C5: '1'
## Warning: Coercing text to numeric in E7869 / R7869C5: '1'
## Warning: Coercing text to numeric in E7870 / R7870C5: '1'
## Warning: Coercing text to numeric in E7871 / R7871C5: '1'
## Warning: Coercing text to numeric in E7872 / R7872C5: '1'
## Warning: Coercing text to numeric in E7873 / R7873C5: '1'
## Warning: Coercing text to numeric in E7874 / R7874C5: '1'
## Warning: Coercing text to numeric in E7875 / R7875C5: '1'
## Warning: Coercing text to numeric in E7876 / R7876C5: '1'
## Warning: Coercing text to numeric in E7877 / R7877C5: '1'
## Warning: Coercing text to numeric in E7878 / R7878C5: '1'
## Warning: Coercing text to numeric in E7879 / R7879C5: '1'
## Warning: Coercing text to numeric in E7880 / R7880C5: '1'
## Warning: Coercing text to numeric in E7881 / R7881C5: '1'
## Warning: Coercing text to numeric in E7882 / R7882C5: '1'
## Warning: Coercing text to numeric in E7883 / R7883C5: '1'
## Warning: Coercing text to numeric in E7884 / R7884C5: '1'
## Warning: Coercing text to numeric in E7885 / R7885C5: '1'
## Warning: Coercing text to numeric in E7886 / R7886C5: '1'
## Warning: Coercing text to numeric in E7887 / R7887C5: '1'
## Warning: Coercing text to numeric in E7888 / R7888C5: '1'
## Warning: Coercing text to numeric in E7889 / R7889C5: '1'
## Warning: Coercing text to numeric in E7890 / R7890C5: '1'
## Warning: Coercing text to numeric in E7891 / R7891C5: '1'
## Warning: Coercing text to numeric in E7892 / R7892C5: '2'
## Warning: Coercing text to numeric in E7893 / R7893C5: '2'
## Warning: Coercing text to numeric in E7894 / R7894C5: '2'
## Warning: Coercing text to numeric in E7895 / R7895C5: '2'
## Warning: Coercing text to numeric in E7896 / R7896C5: '2'
## Warning: Coercing text to numeric in E7897 / R7897C5: '2'
## Warning: Coercing text to numeric in E7898 / R7898C5: '1'
## Warning: Coercing text to numeric in E7899 / R7899C5: '1'
## Warning: Coercing text to numeric in E7900 / R7900C5: '1'
## Warning: Coercing text to numeric in E7901 / R7901C5: '1'
## Warning: Coercing text to numeric in E7902 / R7902C5: '1'
## Warning: Coercing text to numeric in E7903 / R7903C5: '1'
## Warning: Coercing text to numeric in E7904 / R7904C5: '2'
## Warning: Coercing text to numeric in E7905 / R7905C5: '2'
## Warning: Coercing text to numeric in E7906 / R7906C5: '2'
## Warning: Coercing text to numeric in E7907 / R7907C5: '2'
## Warning: Coercing text to numeric in E7908 / R7908C5: '2'
## Warning: Coercing text to numeric in E7909 / R7909C5: '2'
## Warning: Coercing text to numeric in E7910 / R7910C5: '2'
## Warning: Coercing text to numeric in E7911 / R7911C5: '2'
## Warning: Coercing text to numeric in E7912 / R7912C5: '2'
## Warning: Coercing text to numeric in E7913 / R7913C5: '2'
## Warning: Coercing text to numeric in E7914 / R7914C5: '2'
## Warning: Coercing text to numeric in E7915 / R7915C5: '2'
## Warning: Coercing text to numeric in E7916 / R7916C5: '1'
## Warning: Coercing text to numeric in E7917 / R7917C5: '1'
## Warning: Coercing text to numeric in E7918 / R7918C5: '1'
## Warning: Coercing text to numeric in E7919 / R7919C5: '1'
## Warning: Coercing text to numeric in E7920 / R7920C5: '1'
## Warning: Coercing text to numeric in E7921 / R7921C5: '1'
## Warning: Coercing text to numeric in E7922 / R7922C5: '2'
## Warning: Coercing text to numeric in E7923 / R7923C5: '2'
## Warning: Coercing text to numeric in E7924 / R7924C5: '2'
## Warning: Coercing text to numeric in E7925 / R7925C5: '2'
## Warning: Coercing text to numeric in E7926 / R7926C5: '2'
## Warning: Coercing text to numeric in E7927 / R7927C5: '2'
## Warning: Coercing text to numeric in E7928 / R7928C5: '1'
## Warning: Coercing text to numeric in E7929 / R7929C5: '1'
## Warning: Coercing text to numeric in E7930 / R7930C5: '1'
## Warning: Coercing text to numeric in E7931 / R7931C5: '1'
## Warning: Coercing text to numeric in E7932 / R7932C5: '1'
## Warning: Coercing text to numeric in E7933 / R7933C5: '1'
## Warning: Coercing text to numeric in E7934 / R7934C5: '1'
## Warning: Coercing text to numeric in E7935 / R7935C5: '1'
## Warning: Coercing text to numeric in E7936 / R7936C5: '1'
## Warning: Coercing text to numeric in E7937 / R7937C5: '1'
## Warning: Coercing text to numeric in E7938 / R7938C5: '1'
## Warning: Coercing text to numeric in E7939 / R7939C5: '1'
## Warning: Coercing text to numeric in E7940 / R7940C5: '1'
## Warning: Coercing text to numeric in E7941 / R7941C5: '1'
## Warning: Coercing text to numeric in E7942 / R7942C5: '1'
## Warning: Coercing text to numeric in E7943 / R7943C5: '1'
## Warning: Coercing text to numeric in E7944 / R7944C5: '1'
## Warning: Coercing text to numeric in E7945 / R7945C5: '1'
## Warning: Coercing text to numeric in E7946 / R7946C5: '1'
## Warning: Coercing text to numeric in E7947 / R7947C5: '1'
## Warning: Coercing text to numeric in E7948 / R7948C5: '1'
## Warning: Coercing text to numeric in E7949 / R7949C5: '1'
## Warning: Coercing text to numeric in E7950 / R7950C5: '1'
## Warning: Coercing text to numeric in E7951 / R7951C5: '1'
## Warning: Coercing text to numeric in E7952 / R7952C5: '2'
## Warning: Coercing text to numeric in E7953 / R7953C5: '2'
## Warning: Coercing text to numeric in E7954 / R7954C5: '2'
## Warning: Coercing text to numeric in E7955 / R7955C5: '2'
## Warning: Coercing text to numeric in E7956 / R7956C5: '2'
## Warning: Coercing text to numeric in E7957 / R7957C5: '2'
## Warning: Coercing text to numeric in E7958 / R7958C5: '2'
## Warning: Coercing text to numeric in E7959 / R7959C5: '2'
## Warning: Coercing text to numeric in E7960 / R7960C5: '2'
## Warning: Coercing text to numeric in E7961 / R7961C5: '2'
## Warning: Coercing text to numeric in E7962 / R7962C5: '2'
## Warning: Coercing text to numeric in E7963 / R7963C5: '2'
## Warning: Coercing text to numeric in E7964 / R7964C5: '1'
## Warning: Coercing text to numeric in E7965 / R7965C5: '1'
## Warning: Coercing text to numeric in E7966 / R7966C5: '1'
## Warning: Coercing text to numeric in E7967 / R7967C5: '1'
## Warning: Coercing text to numeric in E7968 / R7968C5: '1'
## Warning: Coercing text to numeric in E7969 / R7969C5: '1'
## Warning: Coercing text to numeric in E7970 / R7970C5: '2'
## Warning: Coercing text to numeric in E7971 / R7971C5: '2'
## Warning: Coercing text to numeric in E7972 / R7972C5: '2'
## Warning: Coercing text to numeric in E7973 / R7973C5: '2'
## Warning: Coercing text to numeric in E7974 / R7974C5: '2'
## Warning: Coercing text to numeric in E7975 / R7975C5: '2'
## Warning: Coercing text to numeric in E7976 / R7976C5: '2'
## Warning: Coercing text to numeric in E7977 / R7977C5: '2'
## Warning: Coercing text to numeric in E7978 / R7978C5: '2'
## Warning: Coercing text to numeric in E7979 / R7979C5: '2'
## Warning: Coercing text to numeric in E7980 / R7980C5: '2'
## Warning: Coercing text to numeric in E7981 / R7981C5: '2'
## Warning: Coercing text to numeric in E7982 / R7982C5: '2'
## Warning: Coercing text to numeric in E7983 / R7983C5: '2'
## Warning: Coercing text to numeric in E7984 / R7984C5: '2'
## Warning: Coercing text to numeric in E7985 / R7985C5: '2'
## Warning: Coercing text to numeric in E7986 / R7986C5: '2'
## Warning: Coercing text to numeric in E7987 / R7987C5: '2'
## Warning: Coercing text to numeric in E7988 / R7988C5: '2'
## Warning: Coercing text to numeric in E7989 / R7989C5: '2'
## Warning: Coercing text to numeric in E7990 / R7990C5: '2'
## Warning: Coercing text to numeric in E7991 / R7991C5: '2'
## Warning: Coercing text to numeric in E7992 / R7992C5: '2'
## Warning: Coercing text to numeric in E7993 / R7993C5: '2'
## Warning: Coercing text to numeric in E7994 / R7994C5: '1'
## Warning: Coercing text to numeric in E7995 / R7995C5: '1'
## Warning: Coercing text to numeric in E7996 / R7996C5: '1'
## Warning: Coercing text to numeric in E7997 / R7997C5: '1'
## Warning: Coercing text to numeric in E7998 / R7998C5: '1'
## Warning: Coercing text to numeric in E7999 / R7999C5: '1'
## Warning: Coercing text to numeric in E8000 / R8000C5: '1'
## Warning: Coercing text to numeric in E8001 / R8001C5: '1'
## Warning: Coercing text to numeric in E8002 / R8002C5: '1'
## Warning: Coercing text to numeric in E8003 / R8003C5: '1'
## Warning: Coercing text to numeric in E8004 / R8004C5: '1'
## Warning: Coercing text to numeric in E8005 / R8005C5: '1'
## Warning: Coercing text to numeric in E8006 / R8006C5: '1'
## Warning: Coercing text to numeric in E8007 / R8007C5: '1'
## Warning: Coercing text to numeric in E8008 / R8008C5: '1'
## Warning: Coercing text to numeric in E8009 / R8009C5: '1'
## Warning: Coercing text to numeric in E8010 / R8010C5: '1'
## Warning: Coercing text to numeric in E8011 / R8011C5: '1'
## Warning: Coercing text to numeric in E8012 / R8012C5: '1'
## Warning: Coercing text to numeric in E8013 / R8013C5: '1'
## Warning: Coercing text to numeric in E8014 / R8014C5: '1'
## Warning: Coercing text to numeric in E8015 / R8015C5: '1'
## Warning: Coercing text to numeric in E8016 / R8016C5: '1'
## Warning: Coercing text to numeric in E8017 / R8017C5: '1'
## Warning: Coercing text to numeric in E8018 / R8018C5: '1'
## Warning: Coercing text to numeric in E8019 / R8019C5: '1'
## Warning: Coercing text to numeric in E8020 / R8020C5: '1'
## Warning: Coercing text to numeric in E8021 / R8021C5: '1'
## Warning: Coercing text to numeric in E8022 / R8022C5: '1'
## Warning: Coercing text to numeric in E8023 / R8023C5: '1'
## Warning: Coercing text to numeric in E8024 / R8024C5: '2'
## Warning: Coercing text to numeric in E8025 / R8025C5: '2'
## Warning: Coercing text to numeric in E8026 / R8026C5: '2'
## Warning: Coercing text to numeric in E8027 / R8027C5: '2'
## Warning: Coercing text to numeric in E8028 / R8028C5: '2'
## Warning: Coercing text to numeric in E8029 / R8029C5: '2'
## Warning: Coercing text to numeric in E8030 / R8030C5: '1'
## Warning: Coercing text to numeric in E8031 / R8031C5: '1'
## Warning: Coercing text to numeric in E8032 / R8032C5: '1'
## Warning: Coercing text to numeric in E8033 / R8033C5: '1'
## Warning: Coercing text to numeric in E8034 / R8034C5: '1'
## Warning: Coercing text to numeric in E8035 / R8035C5: '1'
## Warning: Coercing text to numeric in E8036 / R8036C5: '2'
## Warning: Coercing text to numeric in E8037 / R8037C5: '2'
## Warning: Coercing text to numeric in E8038 / R8038C5: '2'
## Warning: Coercing text to numeric in E8039 / R8039C5: '2'
## Warning: Coercing text to numeric in E8040 / R8040C5: '2'
## Warning: Coercing text to numeric in E8041 / R8041C5: '2'
## Warning: Coercing text to numeric in E8042 / R8042C5: '2'
## Warning: Coercing text to numeric in E8043 / R8043C5: '2'
## Warning: Coercing text to numeric in E8044 / R8044C5: '2'
## Warning: Coercing text to numeric in E8045 / R8045C5: '2'
## Warning: Coercing text to numeric in E8046 / R8046C5: '2'
## Warning: Coercing text to numeric in E8047 / R8047C5: '2'
## Warning: Coercing text to numeric in E8048 / R8048C5: '2'
## Warning: Coercing text to numeric in E8049 / R8049C5: '2'
## Warning: Coercing text to numeric in E8050 / R8050C5: '2'
## Warning: Coercing text to numeric in E8051 / R8051C5: '2'
## Warning: Coercing text to numeric in E8052 / R8052C5: '2'
## Warning: Coercing text to numeric in E8053 / R8053C5: '2'
## Warning: Coercing text to numeric in E8054 / R8054C5: '2'
## Warning: Coercing text to numeric in E8055 / R8055C5: '2'
## Warning: Coercing text to numeric in E8056 / R8056C5: '2'
## Warning: Coercing text to numeric in E8057 / R8057C5: '2'
## Warning: Coercing text to numeric in E8058 / R8058C5: '2'
## Warning: Coercing text to numeric in E8059 / R8059C5: '2'
## Warning: Coercing text to numeric in E8060 / R8060C5: '1'
## Warning: Coercing text to numeric in E8061 / R8061C5: '1'
## Warning: Coercing text to numeric in E8062 / R8062C5: '1'
## Warning: Coercing text to numeric in E8063 / R8063C5: '1'
## Warning: Coercing text to numeric in E8064 / R8064C5: '1'
## Warning: Coercing text to numeric in E8065 / R8065C5: '1'
## Warning: Coercing text to numeric in E8066 / R8066C5: '1'
## Warning: Coercing text to numeric in E8067 / R8067C5: '1'
## Warning: Coercing text to numeric in E8068 / R8068C5: '1'
## Warning: Coercing text to numeric in E8069 / R8069C5: '1'
## Warning: Coercing text to numeric in E8070 / R8070C5: '1'
## Warning: Coercing text to numeric in E8071 / R8071C5: '1'
## Warning: Coercing text to numeric in E8072 / R8072C5: '2'
## Warning: Coercing text to numeric in E8073 / R8073C5: '2'
## Warning: Coercing text to numeric in E8074 / R8074C5: '2'
## Warning: Coercing text to numeric in E8075 / R8075C5: '2'
## Warning: Coercing text to numeric in E8076 / R8076C5: '2'
## Warning: Coercing text to numeric in E8077 / R8077C5: '2'
## Warning: Coercing text to numeric in E8078 / R8078C5: '2'
## Warning: Coercing text to numeric in E8079 / R8079C5: '2'
## Warning: Coercing text to numeric in E8080 / R8080C5: '2'
## Warning: Coercing text to numeric in E8081 / R8081C5: '2'
## Warning: Coercing text to numeric in E8082 / R8082C5: '2'
## Warning: Coercing text to numeric in E8083 / R8083C5: '2'
## Warning: Coercing text to numeric in E8084 / R8084C5: '1'
## Warning: Coercing text to numeric in E8085 / R8085C5: '1'
## Warning: Coercing text to numeric in E8086 / R8086C5: '1'
## Warning: Coercing text to numeric in E8087 / R8087C5: '1'
## Warning: Coercing text to numeric in E8088 / R8088C5: '1'
## Warning: Coercing text to numeric in E8089 / R8089C5: '1'
## Warning: Coercing text to numeric in E8090 / R8090C5: '1'
## Warning: Coercing text to numeric in E8091 / R8091C5: '1'
## Warning: Coercing text to numeric in E8092 / R8092C5: '1'
## Warning: Coercing text to numeric in E8093 / R8093C5: '1'
## Warning: Coercing text to numeric in E8094 / R8094C5: '1'
## Warning: Coercing text to numeric in E8095 / R8095C5: '1'
## Warning: Coercing text to numeric in E8096 / R8096C5: '1'
## Warning: Coercing text to numeric in E8097 / R8097C5: '1'
## Warning: Coercing text to numeric in E8098 / R8098C5: '1'
## Warning: Coercing text to numeric in E8099 / R8099C5: '1'
## Warning: Coercing text to numeric in E8100 / R8100C5: '1'
## Warning: Coercing text to numeric in E8101 / R8101C5: '1'
## Warning: Coercing text to numeric in E8102 / R8102C5: '2'
## Warning: Coercing text to numeric in E8103 / R8103C5: '2'
## Warning: Coercing text to numeric in E8104 / R8104C5: '2'
## Warning: Coercing text to numeric in E8105 / R8105C5: '2'
## Warning: Coercing text to numeric in E8106 / R8106C5: '2'
## Warning: Coercing text to numeric in E8107 / R8107C5: '2'
## Warning: Coercing text to numeric in E8108 / R8108C5: '2'
## Warning: Coercing text to numeric in E8109 / R8109C5: '2'
## Warning: Coercing text to numeric in E8110 / R8110C5: '2'
## Warning: Coercing text to numeric in E8111 / R8111C5: '2'
## Warning: Coercing text to numeric in E8112 / R8112C5: '2'
## Warning: Coercing text to numeric in E8113 / R8113C5: '2'
## Warning: Coercing text to numeric in E8114 / R8114C5: '2'
## Warning: Coercing text to numeric in E8115 / R8115C5: '2'
## Warning: Coercing text to numeric in E8116 / R8116C5: '2'
## Warning: Coercing text to numeric in E8117 / R8117C5: '2'
## Warning: Coercing text to numeric in E8118 / R8118C5: '2'
## Warning: Coercing text to numeric in E8119 / R8119C5: '2'
## Warning: Coercing text to numeric in E8120 / R8120C5: '2'
## Warning: Coercing text to numeric in E8121 / R8121C5: '2'
## Warning: Coercing text to numeric in E8122 / R8122C5: '2'
## Warning: Coercing text to numeric in E8123 / R8123C5: '2'
## Warning: Coercing text to numeric in E8124 / R8124C5: '2'
## Warning: Coercing text to numeric in E8125 / R8125C5: '2'
## Warning: Coercing text to numeric in E8126 / R8126C5: '1'
## Warning: Coercing text to numeric in E8127 / R8127C5: '1'
## Warning: Coercing text to numeric in E8128 / R8128C5: '1'
## Warning: Coercing text to numeric in E8129 / R8129C5: '1'
## Warning: Coercing text to numeric in E8130 / R8130C5: '1'
## Warning: Coercing text to numeric in E8131 / R8131C5: '1'
## Warning: Coercing text to numeric in E8132 / R8132C5: '1'
## Warning: Coercing text to numeric in E8133 / R8133C5: '1'
## Warning: Coercing text to numeric in E8134 / R8134C5: '1'
## Warning: Coercing text to numeric in E8135 / R8135C5: '1'
## Warning: Coercing text to numeric in E8136 / R8136C5: '1'
## Warning: Coercing text to numeric in E8137 / R8137C5: '1'
## Warning: Coercing text to numeric in E8138 / R8138C5: '2'
## Warning: Coercing text to numeric in E8139 / R8139C5: '2'
## Warning: Coercing text to numeric in E8140 / R8140C5: '2'
## Warning: Coercing text to numeric in E8141 / R8141C5: '2'
## Warning: Coercing text to numeric in E8142 / R8142C5: '2'
## Warning: Coercing text to numeric in E8143 / R8143C5: '2'
## Warning: Coercing text to numeric in E8144 / R8144C5: '2'
## Warning: Coercing text to numeric in E8145 / R8145C5: '2'
## Warning: Coercing text to numeric in E8146 / R8146C5: '2'
## Warning: Coercing text to numeric in E8147 / R8147C5: '2'
## Warning: Coercing text to numeric in E8148 / R8148C5: '2'
## Warning: Coercing text to numeric in E8149 / R8149C5: '2'
## Warning: Coercing text to numeric in E8150 / R8150C5: '2'
## Warning: Coercing text to numeric in E8151 / R8151C5: '2'
## Warning: Coercing text to numeric in E8152 / R8152C5: '2'
## Warning: Coercing text to numeric in E8153 / R8153C5: '2'
## Warning: Coercing text to numeric in E8154 / R8154C5: '2'
## Warning: Coercing text to numeric in E8155 / R8155C5: '2'
## Warning: Coercing text to numeric in E8156 / R8156C5: '2'
## Warning: Coercing text to numeric in E8157 / R8157C5: '2'
## Warning: Coercing text to numeric in E8158 / R8158C5: '2'
## Warning: Coercing text to numeric in E8159 / R8159C5: '2'
## Warning: Coercing text to numeric in E8160 / R8160C5: '2'
## Warning: Coercing text to numeric in E8161 / R8161C5: '2'
## Warning: Coercing text to numeric in E8162 / R8162C5: '2'
## Warning: Coercing text to numeric in E8163 / R8163C5: '2'
## Warning: Coercing text to numeric in E8164 / R8164C5: '2'
## Warning: Coercing text to numeric in E8165 / R8165C5: '2'
## Warning: Coercing text to numeric in E8166 / R8166C5: '2'
## Warning: Coercing text to numeric in E8167 / R8167C5: '2'
## Warning: Coercing text to numeric in E8168 / R8168C5: '2'
## Warning: Coercing text to numeric in E8169 / R8169C5: '2'
## Warning: Coercing text to numeric in E8170 / R8170C5: '2'
## Warning: Coercing text to numeric in E8171 / R8171C5: '2'
## Warning: Coercing text to numeric in E8172 / R8172C5: '2'
## Warning: Coercing text to numeric in E8173 / R8173C5: '2'
## Warning: Coercing text to numeric in E8174 / R8174C5: '1'
## Warning: Coercing text to numeric in E8175 / R8175C5: '1'
## Warning: Coercing text to numeric in E8176 / R8176C5: '1'
## Warning: Coercing text to numeric in E8177 / R8177C5: '1'
## Warning: Coercing text to numeric in E8178 / R8178C5: '1'
## Warning: Coercing text to numeric in E8179 / R8179C5: '1'
## Warning: Coercing text to numeric in E8180 / R8180C5: '1'
## Warning: Coercing text to numeric in E8181 / R8181C5: '1'
## Warning: Coercing text to numeric in E8182 / R8182C5: '1'
## Warning: Coercing text to numeric in E8183 / R8183C5: '1'
## Warning: Coercing text to numeric in E8184 / R8184C5: '1'
## Warning: Coercing text to numeric in E8185 / R8185C5: '1'
## Warning: Coercing text to numeric in E8186 / R8186C5: '1'
## Warning: Coercing text to numeric in E8187 / R8187C5: '1'
## Warning: Coercing text to numeric in E8188 / R8188C5: '1'
## Warning: Coercing text to numeric in E8189 / R8189C5: '1'
## Warning: Coercing text to numeric in E8190 / R8190C5: '1'
## Warning: Coercing text to numeric in E8191 / R8191C5: '1'
## Warning: Coercing text to numeric in E8192 / R8192C5: '1'
## Warning: Coercing text to numeric in E8193 / R8193C5: '1'
## Warning: Coercing text to numeric in E8194 / R8194C5: '1'
## Warning: Coercing text to numeric in E8195 / R8195C5: '1'
## Warning: Coercing text to numeric in E8196 / R8196C5: '1'
## Warning: Coercing text to numeric in E8197 / R8197C5: '1'
## Warning: Coercing text to numeric in E8198 / R8198C5: '1'
## Warning: Coercing text to numeric in E8199 / R8199C5: '1'
## Warning: Coercing text to numeric in E8200 / R8200C5: '1'
## Warning: Coercing text to numeric in E8201 / R8201C5: '1'
## Warning: Coercing text to numeric in E8202 / R8202C5: '1'
## Warning: Coercing text to numeric in E8203 / R8203C5: '1'
## Warning: Coercing text to numeric in E8204 / R8204C5: '2'
## Warning: Coercing text to numeric in E8205 / R8205C5: '2'
## Warning: Coercing text to numeric in E8206 / R8206C5: '2'
## Warning: Coercing text to numeric in E8207 / R8207C5: '2'
## Warning: Coercing text to numeric in E8208 / R8208C5: '2'
## Warning: Coercing text to numeric in E8209 / R8209C5: '2'
## Warning: Coercing text to numeric in E8210 / R8210C5: '2'
## Warning: Coercing text to numeric in E8211 / R8211C5: '2'
## Warning: Coercing text to numeric in E8212 / R8212C5: '2'
## Warning: Coercing text to numeric in E8213 / R8213C5: '2'
## Warning: Coercing text to numeric in E8214 / R8214C5: '2'
## Warning: Coercing text to numeric in E8215 / R8215C5: '2'
## Warning: Coercing text to numeric in E8216 / R8216C5: '1'
## Warning: Coercing text to numeric in E8217 / R8217C5: '1'
## Warning: Coercing text to numeric in E8218 / R8218C5: '1'
## Warning: Coercing text to numeric in E8219 / R8219C5: '1'
## Warning: Coercing text to numeric in E8220 / R8220C5: '1'
## Warning: Coercing text to numeric in E8221 / R8221C5: '1'
## Warning: Coercing text to numeric in E8222 / R8222C5: '2'
## Warning: Coercing text to numeric in E8223 / R8223C5: '2'
## Warning: Coercing text to numeric in E8224 / R8224C5: '2'
## Warning: Coercing text to numeric in E8225 / R8225C5: '2'
## Warning: Coercing text to numeric in E8226 / R8226C5: '2'
## Warning: Coercing text to numeric in E8227 / R8227C5: '2'
## Warning: Coercing text to numeric in E8228 / R8228C5: '1'
## Warning: Coercing text to numeric in E8229 / R8229C5: '1'
## Warning: Coercing text to numeric in E8230 / R8230C5: '1'
## Warning: Coercing text to numeric in E8231 / R8231C5: '1'
## Warning: Coercing text to numeric in E8232 / R8232C5: '1'
## Warning: Coercing text to numeric in E8233 / R8233C5: '1'
## Warning: Coercing text to numeric in E8234 / R8234C5: '1'
## Warning: Coercing text to numeric in E8235 / R8235C5: '1'
## Warning: Coercing text to numeric in E8236 / R8236C5: '1'
## Warning: Coercing text to numeric in E8237 / R8237C5: '1'
## Warning: Coercing text to numeric in E8238 / R8238C5: '1'
## Warning: Coercing text to numeric in E8239 / R8239C5: '1'
## Warning: Coercing text to numeric in E8240 / R8240C5: '1'
## Warning: Coercing text to numeric in E8241 / R8241C5: '1'
## Warning: Coercing text to numeric in E8242 / R8242C5: '1'
## Warning: Coercing text to numeric in E8243 / R8243C5: '1'
## Warning: Coercing text to numeric in E8244 / R8244C5: '1'
## Warning: Coercing text to numeric in E8245 / R8245C5: '1'
## Warning: Coercing text to numeric in E8246 / R8246C5: '1'
## Warning: Coercing text to numeric in E8247 / R8247C5: '1'
## Warning: Coercing text to numeric in E8248 / R8248C5: '1'
## Warning: Coercing text to numeric in E8249 / R8249C5: '1'
## Warning: Coercing text to numeric in E8250 / R8250C5: '1'
## Warning: Coercing text to numeric in E8251 / R8251C5: '1'
## Warning: Coercing text to numeric in E8252 / R8252C5: '2'
## Warning: Coercing text to numeric in E8253 / R8253C5: '2'
## Warning: Coercing text to numeric in E8254 / R8254C5: '2'
## Warning: Coercing text to numeric in E8255 / R8255C5: '2'
## Warning: Coercing text to numeric in E8256 / R8256C5: '2'
## Warning: Coercing text to numeric in E8257 / R8257C5: '2'
## Warning: Coercing text to numeric in E8258 / R8258C5: '2'
## Warning: Coercing text to numeric in E8259 / R8259C5: '2'
## Warning: Coercing text to numeric in E8260 / R8260C5: '2'
## Warning: Coercing text to numeric in E8261 / R8261C5: '2'
## Warning: Coercing text to numeric in E8262 / R8262C5: '2'
## Warning: Coercing text to numeric in E8263 / R8263C5: '2'
## Warning: Coercing text to numeric in E8264 / R8264C5: '1'
## Warning: Coercing text to numeric in E8265 / R8265C5: '1'
## Warning: Coercing text to numeric in E8266 / R8266C5: '1'
## Warning: Coercing text to numeric in E8267 / R8267C5: '1'
## Warning: Coercing text to numeric in E8268 / R8268C5: '1'
## Warning: Coercing text to numeric in E8269 / R8269C5: '1'
## Warning: Coercing text to numeric in E8270 / R8270C5: '2'
## Warning: Coercing text to numeric in E8271 / R8271C5: '2'
## Warning: Coercing text to numeric in E8272 / R8272C5: '2'
## Warning: Coercing text to numeric in E8273 / R8273C5: '2'
## Warning: Coercing text to numeric in E8274 / R8274C5: '2'
## Warning: Coercing text to numeric in E8275 / R8275C5: '2'
## Warning: Coercing text to numeric in E8276 / R8276C5: '2'
## Warning: Coercing text to numeric in E8277 / R8277C5: '2'
## Warning: Coercing text to numeric in E8278 / R8278C5: '2'
## Warning: Coercing text to numeric in E8279 / R8279C5: '2'
## Warning: Coercing text to numeric in E8280 / R8280C5: '2'
## Warning: Coercing text to numeric in E8281 / R8281C5: '2'
## Warning: Coercing text to numeric in E8282 / R8282C5: '2'
## Warning: Coercing text to numeric in E8283 / R8283C5: '2'
## Warning: Coercing text to numeric in E8284 / R8284C5: '2'
## Warning: Coercing text to numeric in E8285 / R8285C5: '2'
## Warning: Coercing text to numeric in E8286 / R8286C5: '2'
## Warning: Coercing text to numeric in E8287 / R8287C5: '2'
## Warning: Coercing text to numeric in E8288 / R8288C5: '2'
## Warning: Coercing text to numeric in E8289 / R8289C5: '2'
## Warning: Coercing text to numeric in E8290 / R8290C5: '2'
## Warning: Coercing text to numeric in E8291 / R8291C5: '2'
## Warning: Coercing text to numeric in E8292 / R8292C5: '2'
## Warning: Coercing text to numeric in E8293 / R8293C5: '2'
## Warning: Coercing text to numeric in E8294 / R8294C5: '2'
## Warning: Coercing text to numeric in E8295 / R8295C5: '2'
## Warning: Coercing text to numeric in E8296 / R8296C5: '2'
## Warning: Coercing text to numeric in E8297 / R8297C5: '2'
## Warning: Coercing text to numeric in E8298 / R8298C5: '2'
## Warning: Coercing text to numeric in E8299 / R8299C5: '2'
## Warning: Coercing text to numeric in E8300 / R8300C5: '1'
## Warning: Coercing text to numeric in E8301 / R8301C5: '1'
## Warning: Coercing text to numeric in E8302 / R8302C5: '1'
## Warning: Coercing text to numeric in E8303 / R8303C5: '1'
## Warning: Coercing text to numeric in E8304 / R8304C5: '1'
## Warning: Coercing text to numeric in E8305 / R8305C5: '1'
## Warning: Coercing text to numeric in E8306 / R8306C5: '1'
## Warning: Coercing text to numeric in E8307 / R8307C5: '1'
## Warning: Coercing text to numeric in E8308 / R8308C5: '1'
## Warning: Coercing text to numeric in E8309 / R8309C5: '1'
## Warning: Coercing text to numeric in E8310 / R8310C5: '1'
## Warning: Coercing text to numeric in E8311 / R8311C5: '1'
## Warning: Coercing text to numeric in E8312 / R8312C5: '1'
## Warning: Coercing text to numeric in E8313 / R8313C5: '1'
## Warning: Coercing text to numeric in E8314 / R8314C5: '1'
## Warning: Coercing text to numeric in E8315 / R8315C5: '1'
## Warning: Coercing text to numeric in E8316 / R8316C5: '1'
## Warning: Coercing text to numeric in E8317 / R8317C5: '1'
## Warning: Coercing text to numeric in E8318 / R8318C5: '1'
## Warning: Coercing text to numeric in E8319 / R8319C5: '1'
## Warning: Coercing text to numeric in E8320 / R8320C5: '1'
## Warning: Coercing text to numeric in E8321 / R8321C5: '1'
## Warning: Coercing text to numeric in E8322 / R8322C5: '1'
## Warning: Coercing text to numeric in E8323 / R8323C5: '1'
## Warning: Coercing text to numeric in E8324 / R8324C5: '1'
## Warning: Coercing text to numeric in E8325 / R8325C5: '1'
## Warning: Coercing text to numeric in E8326 / R8326C5: '1'
## Warning: Coercing text to numeric in E8327 / R8327C5: '1'
## Warning: Coercing text to numeric in E8328 / R8328C5: '1'
## Warning: Coercing text to numeric in E8329 / R8329C5: '1'
## Warning: Coercing text to numeric in E8330 / R8330C5: '1'
## Warning: Coercing text to numeric in E8331 / R8331C5: '1'
## Warning: Coercing text to numeric in E8332 / R8332C5: '1'
## Warning: Coercing text to numeric in E8333 / R8333C5: '1'
## Warning: Coercing text to numeric in E8334 / R8334C5: '1'
## Warning: Coercing text to numeric in E8335 / R8335C5: '1'
## Warning: Coercing text to numeric in E8336 / R8336C5: '1'
## Warning: Coercing text to numeric in E8337 / R8337C5: '1'
## Warning: Coercing text to numeric in E8338 / R8338C5: '1'
## Warning: Coercing text to numeric in E8339 / R8339C5: '1'
## Warning: Coercing text to numeric in E8340 / R8340C5: '1'
## Warning: Coercing text to numeric in E8341 / R8341C5: '1'
## Warning: Coercing text to numeric in E8342 / R8342C5: '2'
## Warning: Coercing text to numeric in E8343 / R8343C5: '2'
## Warning: Coercing text to numeric in E8344 / R8344C5: '2'
## Warning: Coercing text to numeric in E8345 / R8345C5: '2'
## Warning: Coercing text to numeric in E8346 / R8346C5: '2'
## Warning: Coercing text to numeric in E8347 / R8347C5: '2'
## Warning: Coercing text to numeric in E8348 / R8348C5: '1'
## Warning: Coercing text to numeric in E8349 / R8349C5: '1'
## Warning: Coercing text to numeric in E8350 / R8350C5: '1'
## Warning: Coercing text to numeric in E8351 / R8351C5: '1'
## Warning: Coercing text to numeric in E8352 / R8352C5: '1'
## Warning: Coercing text to numeric in E8353 / R8353C5: '1'
## Warning: Coercing text to numeric in E8354 / R8354C5: '2'
## Warning: Coercing text to numeric in E8355 / R8355C5: '2'
## Warning: Coercing text to numeric in E8356 / R8356C5: '2'
## Warning: Coercing text to numeric in E8357 / R8357C5: '2'
## Warning: Coercing text to numeric in E8358 / R8358C5: '2'
## Warning: Coercing text to numeric in E8359 / R8359C5: '2'
## Warning: Coercing text to numeric in E8360 / R8360C5: '1'
## Warning: Coercing text to numeric in E8361 / R8361C5: '1'
## Warning: Coercing text to numeric in E8362 / R8362C5: '1'
## Warning: Coercing text to numeric in E8363 / R8363C5: '1'
## Warning: Coercing text to numeric in E8364 / R8364C5: '1'
## Warning: Coercing text to numeric in E8365 / R8365C5: '1'
## Warning: Coercing text to numeric in E8366 / R8366C5: '2'
## Warning: Coercing text to numeric in E8367 / R8367C5: '2'
## Warning: Coercing text to numeric in E8368 / R8368C5: '2'
## Warning: Coercing text to numeric in E8369 / R8369C5: '2'
## Warning: Coercing text to numeric in E8370 / R8370C5: '2'
## Warning: Coercing text to numeric in E8371 / R8371C5: '2'
## Warning: Coercing text to numeric in E8372 / R8372C5: '1'
## Warning: Coercing text to numeric in E8373 / R8373C5: '1'
## Warning: Coercing text to numeric in E8374 / R8374C5: '1'
## Warning: Coercing text to numeric in E8375 / R8375C5: '1'
## Warning: Coercing text to numeric in E8376 / R8376C5: '1'
## Warning: Coercing text to numeric in E8377 / R8377C5: '1'
## Warning: Coercing text to numeric in E8378 / R8378C5: '1'
## Warning: Coercing text to numeric in E8379 / R8379C5: '1'
## Warning: Coercing text to numeric in E8380 / R8380C5: '1'
## Warning: Coercing text to numeric in E8381 / R8381C5: '1'
## Warning: Coercing text to numeric in E8382 / R8382C5: '1'
## Warning: Coercing text to numeric in E8383 / R8383C5: '1'
## Warning: Coercing text to numeric in E8384 / R8384C5: '1'
## Warning: Coercing text to numeric in E8385 / R8385C5: '1'
## Warning: Coercing text to numeric in E8386 / R8386C5: '1'
## Warning: Coercing text to numeric in E8387 / R8387C5: '1'
## Warning: Coercing text to numeric in E8388 / R8388C5: '1'
## Warning: Coercing text to numeric in E8389 / R8389C5: '1'
## Warning: Coercing text to numeric in E8390 / R8390C5: '2'
## Warning: Coercing text to numeric in E8391 / R8391C5: '2'
## Warning: Coercing text to numeric in E8392 / R8392C5: '2'
## Warning: Coercing text to numeric in E8393 / R8393C5: '2'
## Warning: Coercing text to numeric in E8394 / R8394C5: '2'
## Warning: Coercing text to numeric in E8395 / R8395C5: '2'
## Warning: Coercing text to numeric in E8396 / R8396C5: '1'
## Warning: Coercing text to numeric in E8397 / R8397C5: '1'
## Warning: Coercing text to numeric in E8398 / R8398C5: '1'
## Warning: Coercing text to numeric in E8399 / R8399C5: '1'
## Warning: Coercing text to numeric in E8400 / R8400C5: '1'
## Warning: Coercing text to numeric in E8401 / R8401C5: '1'
## Warning: Coercing text to numeric in E8402 / R8402C5: '2'
## Warning: Coercing text to numeric in E8403 / R8403C5: '2'
## Warning: Coercing text to numeric in E8404 / R8404C5: '2'
## Warning: Coercing text to numeric in E8405 / R8405C5: '2'
## Warning: Coercing text to numeric in E8406 / R8406C5: '2'
## Warning: Coercing text to numeric in E8407 / R8407C5: '2'
## Warning: Coercing text to numeric in E8408 / R8408C5: '1'
## Warning: Coercing text to numeric in E8409 / R8409C5: '1'
## Warning: Coercing text to numeric in E8410 / R8410C5: '1'
## Warning: Coercing text to numeric in E8411 / R8411C5: '1'
## Warning: Coercing text to numeric in E8412 / R8412C5: '1'
## Warning: Coercing text to numeric in E8413 / R8413C5: '1'
## Warning: Coercing text to numeric in E8414 / R8414C5: '1'
## Warning: Coercing text to numeric in E8415 / R8415C5: '1'
## Warning: Coercing text to numeric in E8416 / R8416C5: '1'
## Warning: Coercing text to numeric in E8417 / R8417C5: '1'
## Warning: Coercing text to numeric in E8418 / R8418C5: '1'
## Warning: Coercing text to numeric in E8419 / R8419C5: '1'
## Warning: Coercing text to numeric in E8420 / R8420C5: '1'
## Warning: Coercing text to numeric in E8421 / R8421C5: '1'
## Warning: Coercing text to numeric in E8422 / R8422C5: '1'
## Warning: Coercing text to numeric in E8423 / R8423C5: '1'
## Warning: Coercing text to numeric in E8424 / R8424C5: '1'
## Warning: Coercing text to numeric in E8425 / R8425C5: '1'
## Warning: Coercing text to numeric in E8426 / R8426C5: '1'
## Warning: Coercing text to numeric in E8427 / R8427C5: '1'
## Warning: Coercing text to numeric in E8428 / R8428C5: '1'
## Warning: Coercing text to numeric in E8429 / R8429C5: '1'
## Warning: Coercing text to numeric in E8430 / R8430C5: '1'
## Warning: Coercing text to numeric in E8431 / R8431C5: '1'
## Warning: Coercing text to numeric in E8432 / R8432C5: '2'
## Warning: Coercing text to numeric in E8433 / R8433C5: '2'
## Warning: Coercing text to numeric in E8434 / R8434C5: '2'
## Warning: Coercing text to numeric in E8435 / R8435C5: '2'
## Warning: Coercing text to numeric in E8436 / R8436C5: '2'
## Warning: Coercing text to numeric in E8437 / R8437C5: '2'
## Warning: Coercing text to numeric in E8438 / R8438C5: '2'
## Warning: Coercing text to numeric in E8439 / R8439C5: '2'
## Warning: Coercing text to numeric in E8440 / R8440C5: '2'
## Warning: Coercing text to numeric in E8441 / R8441C5: '2'
## Warning: Coercing text to numeric in E8442 / R8442C5: '2'
## Warning: Coercing text to numeric in E8443 / R8443C5: '2'
## Warning: Coercing text to numeric in E8444 / R8444C5: '2'
## Warning: Coercing text to numeric in E8445 / R8445C5: '2'
## Warning: Coercing text to numeric in E8446 / R8446C5: '2'
## Warning: Coercing text to numeric in E8447 / R8447C5: '2'
## Warning: Coercing text to numeric in E8448 / R8448C5: '2'
## Warning: Coercing text to numeric in E8449 / R8449C5: '2'
## Warning: Coercing text to numeric in E8450 / R8450C5: '2'
## Warning: Coercing text to numeric in E8451 / R8451C5: '2'
## Warning: Coercing text to numeric in E8452 / R8452C5: '2'
## Warning: Coercing text to numeric in E8453 / R8453C5: '2'
## Warning: Coercing text to numeric in E8454 / R8454C5: '2'
## Warning: Coercing text to numeric in E8455 / R8455C5: '2'
## Warning: Coercing text to numeric in E8456 / R8456C5: '2'
## Warning: Coercing text to numeric in E8457 / R8457C5: '2'
## Warning: Coercing text to numeric in E8458 / R8458C5: '2'
## Warning: Coercing text to numeric in E8459 / R8459C5: '2'
## Warning: Coercing text to numeric in E8460 / R8460C5: '2'
## Warning: Coercing text to numeric in E8461 / R8461C5: '2'
## Warning: Coercing text to numeric in E8462 / R8462C5: '2'
## Warning: Coercing text to numeric in E8463 / R8463C5: '2'
## Warning: Coercing text to numeric in E8464 / R8464C5: '2'
## Warning: Coercing text to numeric in E8465 / R8465C5: '2'
## Warning: Coercing text to numeric in E8466 / R8466C5: '2'
## Warning: Coercing text to numeric in E8467 / R8467C5: '2'
## Warning: Coercing text to numeric in E8468 / R8468C5: '2'
## Warning: Coercing text to numeric in E8469 / R8469C5: '2'
## Warning: Coercing text to numeric in E8470 / R8470C5: '2'
## Warning: Coercing text to numeric in E8471 / R8471C5: '2'
## Warning: Coercing text to numeric in E8472 / R8472C5: '2'
## Warning: Coercing text to numeric in E8473 / R8473C5: '2'
## Warning: Coercing text to numeric in E8474 / R8474C5: '2'
## Warning: Coercing text to numeric in E8475 / R8475C5: '2'
## Warning: Coercing text to numeric in E8476 / R8476C5: '2'
## Warning: Coercing text to numeric in E8477 / R8477C5: '2'
## Warning: Coercing text to numeric in E8478 / R8478C5: '2'
## Warning: Coercing text to numeric in E8479 / R8479C5: '2'
## Warning: Coercing text to numeric in E8480 / R8480C5: '2'
## Warning: Coercing text to numeric in E8481 / R8481C5: '2'
## Warning: Coercing text to numeric in E8482 / R8482C5: '2'
## Warning: Coercing text to numeric in E8483 / R8483C5: '2'
## Warning: Coercing text to numeric in E8484 / R8484C5: '2'
## Warning: Coercing text to numeric in E8485 / R8485C5: '2'
## Warning: Coercing text to numeric in E8486 / R8486C5: '1'
## Warning: Coercing text to numeric in E8487 / R8487C5: '1'
## Warning: Coercing text to numeric in E8488 / R8488C5: '1'
## Warning: Coercing text to numeric in E8489 / R8489C5: '1'
## Warning: Coercing text to numeric in E8490 / R8490C5: '1'
## Warning: Coercing text to numeric in E8491 / R8491C5: '1'
## Warning: Coercing text to numeric in E8492 / R8492C5: '2'
## Warning: Coercing text to numeric in E8493 / R8493C5: '2'
## Warning: Coercing text to numeric in E8494 / R8494C5: '2'
## Warning: Coercing text to numeric in E8495 / R8495C5: '2'
## Warning: Coercing text to numeric in E8496 / R8496C5: '2'
## Warning: Coercing text to numeric in E8497 / R8497C5: '2'
## Warning: Coercing text to numeric in E8498 / R8498C5: '1'
## Warning: Coercing text to numeric in E8499 / R8499C5: '1'
## Warning: Coercing text to numeric in E8500 / R8500C5: '1'
## Warning: Coercing text to numeric in E8501 / R8501C5: '1'
## Warning: Coercing text to numeric in E8502 / R8502C5: '1'
## Warning: Coercing text to numeric in E8503 / R8503C5: '1'
## Warning: Coercing text to numeric in E8504 / R8504C5: '2'
## Warning: Coercing text to numeric in E8505 / R8505C5: '2'
## Warning: Coercing text to numeric in E8506 / R8506C5: '2'
## Warning: Coercing text to numeric in E8507 / R8507C5: '2'
## Warning: Coercing text to numeric in E8508 / R8508C5: '2'
## Warning: Coercing text to numeric in E8509 / R8509C5: '2'
## Warning: Coercing text to numeric in E8510 / R8510C5: '2'
## Warning: Coercing text to numeric in E8511 / R8511C5: '2'
## Warning: Coercing text to numeric in E8512 / R8512C5: '2'
## Warning: Coercing text to numeric in E8513 / R8513C5: '2'
## Warning: Coercing text to numeric in E8514 / R8514C5: '2'
## Warning: Coercing text to numeric in E8515 / R8515C5: '2'
## Warning: Coercing text to numeric in E8516 / R8516C5: '2'
## Warning: Coercing text to numeric in E8517 / R8517C5: '2'
## Warning: Coercing text to numeric in E8518 / R8518C5: '2'
## Warning: Coercing text to numeric in E8519 / R8519C5: '2'
## Warning: Coercing text to numeric in E8520 / R8520C5: '2'
## Warning: Coercing text to numeric in E8521 / R8521C5: '2'
## Warning: Coercing text to numeric in E8522 / R8522C5: '2'
## Warning: Coercing text to numeric in E8523 / R8523C5: '2'
## Warning: Coercing text to numeric in E8524 / R8524C5: '2'
## Warning: Coercing text to numeric in E8525 / R8525C5: '2'
## Warning: Coercing text to numeric in E8526 / R8526C5: '2'
## Warning: Coercing text to numeric in E8527 / R8527C5: '2'
## Warning: Coercing text to numeric in E8528 / R8528C5: '2'
## Warning: Coercing text to numeric in E8529 / R8529C5: '2'
## Warning: Coercing text to numeric in E8530 / R8530C5: '2'
## Warning: Coercing text to numeric in E8531 / R8531C5: '2'
## Warning: Coercing text to numeric in E8532 / R8532C5: '2'
## Warning: Coercing text to numeric in E8533 / R8533C5: '2'
## Warning: Coercing text to numeric in E8534 / R8534C5: '2'
## Warning: Coercing text to numeric in E8535 / R8535C5: '2'
## Warning: Coercing text to numeric in E8536 / R8536C5: '2'
## Warning: Coercing text to numeric in E8537 / R8537C5: '2'
## Warning: Coercing text to numeric in E8538 / R8538C5: '2'
## Warning: Coercing text to numeric in E8539 / R8539C5: '2'
## Warning: Coercing text to numeric in E8540 / R8540C5: '1'
## Warning: Coercing text to numeric in E8541 / R8541C5: '1'
## Warning: Coercing text to numeric in E8542 / R8542C5: '1'
## Warning: Coercing text to numeric in E8543 / R8543C5: '1'
## Warning: Coercing text to numeric in E8544 / R8544C5: '1'
## Warning: Coercing text to numeric in E8545 / R8545C5: '1'
## Warning: Coercing text to numeric in E8546 / R8546C5: '1'
## Warning: Coercing text to numeric in E8547 / R8547C5: '1'
## Warning: Coercing text to numeric in E8548 / R8548C5: '1'
## Warning: Coercing text to numeric in E8549 / R8549C5: '1'
## Warning: Coercing text to numeric in E8550 / R8550C5: '1'
## Warning: Coercing text to numeric in E8551 / R8551C5: '1'
## Warning: Coercing text to numeric in E8552 / R8552C5: '1'
## Warning: Coercing text to numeric in E8553 / R8553C5: '1'
## Warning: Coercing text to numeric in E8554 / R8554C5: '1'
## Warning: Coercing text to numeric in E8555 / R8555C5: '1'
## Warning: Coercing text to numeric in E8556 / R8556C5: '1'
## Warning: Coercing text to numeric in E8557 / R8557C5: '1'
## Warning: Coercing text to numeric in E8558 / R8558C5: '1'
## Warning: Coercing text to numeric in E8559 / R8559C5: '1'
## Warning: Coercing text to numeric in E8560 / R8560C5: '1'
## Warning: Coercing text to numeric in E8561 / R8561C5: '1'
## Warning: Coercing text to numeric in E8562 / R8562C5: '1'
## Warning: Coercing text to numeric in E8563 / R8563C5: '1'
## Warning: Coercing text to numeric in E8564 / R8564C5: '2'
## Warning: Coercing text to numeric in E8565 / R8565C5: '2'
## Warning: Coercing text to numeric in E8566 / R8566C5: '2'
## Warning: Coercing text to numeric in E8567 / R8567C5: '2'
## Warning: Coercing text to numeric in E8568 / R8568C5: '2'
## Warning: Coercing text to numeric in E8569 / R8569C5: '2'
## Warning: Coercing text to numeric in E8570 / R8570C5: '2'
## Warning: Coercing text to numeric in E8571 / R8571C5: '2'
## Warning: Coercing text to numeric in E8572 / R8572C5: '2'
## Warning: Coercing text to numeric in E8573 / R8573C5: '2'
## Warning: Coercing text to numeric in E8574 / R8574C5: '2'
## Warning: Coercing text to numeric in E8575 / R8575C5: '2'
## Warning: Coercing text to numeric in E8576 / R8576C5: '1'
## Warning: Coercing text to numeric in E8577 / R8577C5: '1'
## Warning: Coercing text to numeric in E8578 / R8578C5: '1'
## Warning: Coercing text to numeric in E8579 / R8579C5: '1'
## Warning: Coercing text to numeric in E8580 / R8580C5: '1'
## Warning: Coercing text to numeric in E8581 / R8581C5: '1'
## Warning: Coercing text to numeric in E8582 / R8582C5: '1'
## Warning: Coercing text to numeric in E8583 / R8583C5: '1'
## Warning: Coercing text to numeric in E8584 / R8584C5: '1'
## Warning: Coercing text to numeric in E8585 / R8585C5: '1'
## Warning: Coercing text to numeric in E8586 / R8586C5: '1'
## Warning: Coercing text to numeric in E8587 / R8587C5: '1'
## Warning: Coercing text to numeric in E8588 / R8588C5: '2'
## Warning: Coercing text to numeric in E8589 / R8589C5: '2'
## Warning: Coercing text to numeric in E8590 / R8590C5: '2'
## Warning: Coercing text to numeric in E8591 / R8591C5: '2'
## Warning: Coercing text to numeric in E8592 / R8592C5: '2'
## Warning: Coercing text to numeric in E8593 / R8593C5: '2'
## Warning: Coercing text to numeric in E8594 / R8594C5: '2'
## Warning: Coercing text to numeric in E8595 / R8595C5: '2'
## Warning: Coercing text to numeric in E8596 / R8596C5: '2'
## Warning: Coercing text to numeric in E8597 / R8597C5: '2'
## Warning: Coercing text to numeric in E8598 / R8598C5: '2'
## Warning: Coercing text to numeric in E8599 / R8599C5: '2'
## Warning: Coercing text to numeric in E8600 / R8600C5: '1'
## Warning: Coercing text to numeric in E8601 / R8601C5: '1'
## Warning: Coercing text to numeric in E8602 / R8602C5: '1'
## Warning: Coercing text to numeric in E8603 / R8603C5: '1'
## Warning: Coercing text to numeric in E8604 / R8604C5: '1'
## Warning: Coercing text to numeric in E8605 / R8605C5: '1'
## Warning: Coercing text to numeric in E8606 / R8606C5: '1'
## Warning: Coercing text to numeric in E8607 / R8607C5: '1'
## Warning: Coercing text to numeric in E8608 / R8608C5: '1'
## Warning: Coercing text to numeric in E8609 / R8609C5: '1'
## Warning: Coercing text to numeric in E8610 / R8610C5: '1'
## Warning: Coercing text to numeric in E8611 / R8611C5: '1'
## Warning: Coercing text to numeric in E8612 / R8612C5: '2'
## Warning: Coercing text to numeric in E8613 / R8613C5: '2'
## Warning: Coercing text to numeric in E8614 / R8614C5: '2'
## Warning: Coercing text to numeric in E8615 / R8615C5: '2'
## Warning: Coercing text to numeric in E8616 / R8616C5: '2'
## Warning: Coercing text to numeric in E8617 / R8617C5: '2'
## Warning: Coercing text to numeric in E8618 / R8618C5: '2'
## Warning: Coercing text to numeric in E8619 / R8619C5: '2'
## Warning: Coercing text to numeric in E8620 / R8620C5: '2'
## Warning: Coercing text to numeric in E8621 / R8621C5: '2'
## Warning: Coercing text to numeric in E8622 / R8622C5: '2'
## Warning: Coercing text to numeric in E8623 / R8623C5: '2'
## Warning: Coercing text to numeric in E8624 / R8624C5: '2'
## Warning: Coercing text to numeric in E8625 / R8625C5: '2'
## Warning: Coercing text to numeric in E8626 / R8626C5: '2'
## Warning: Coercing text to numeric in E8627 / R8627C5: '2'
## Warning: Coercing text to numeric in E8628 / R8628C5: '2'
## Warning: Coercing text to numeric in E8629 / R8629C5: '2'
## Warning: Coercing text to numeric in E8630 / R8630C5: '2'
## Warning: Coercing text to numeric in E8631 / R8631C5: '2'
## Warning: Coercing text to numeric in E8632 / R8632C5: '2'
## Warning: Coercing text to numeric in E8633 / R8633C5: '2'
## Warning: Coercing text to numeric in E8634 / R8634C5: '2'
## Warning: Coercing text to numeric in E8635 / R8635C5: '2'
## Warning: Coercing text to numeric in E8636 / R8636C5: '2'
## Warning: Coercing text to numeric in E8637 / R8637C5: '2'
## Warning: Coercing text to numeric in E8638 / R8638C5: '2'
## Warning: Coercing text to numeric in E8639 / R8639C5: '2'
## Warning: Coercing text to numeric in E8640 / R8640C5: '2'
## Warning: Coercing text to numeric in E8641 / R8641C5: '2'
## Warning: Coercing text to numeric in E8642 / R8642C5: '1'
## Warning: Coercing text to numeric in E8643 / R8643C5: '1'
## Warning: Coercing text to numeric in E8644 / R8644C5: '1'
## Warning: Coercing text to numeric in E8645 / R8645C5: '1'
## Warning: Coercing text to numeric in E8646 / R8646C5: '1'
## Warning: Coercing text to numeric in E8647 / R8647C5: '1'
## Warning: Coercing text to numeric in E8648 / R8648C5: '2'
## Warning: Coercing text to numeric in E8649 / R8649C5: '2'
## Warning: Coercing text to numeric in E8650 / R8650C5: '2'
## Warning: Coercing text to numeric in E8651 / R8651C5: '2'
## Warning: Coercing text to numeric in E8652 / R8652C5: '2'
## Warning: Coercing text to numeric in E8653 / R8653C5: '2'
## Warning: Coercing text to numeric in E8654 / R8654C5: '1'
## Warning: Coercing text to numeric in E8655 / R8655C5: '1'
## Warning: Coercing text to numeric in E8656 / R8656C5: '1'
## Warning: Coercing text to numeric in E8657 / R8657C5: '1'
## Warning: Coercing text to numeric in E8658 / R8658C5: '1'
## Warning: Coercing text to numeric in E8659 / R8659C5: '1'
## Warning: Coercing text to numeric in E8660 / R8660C5: '2'
## Warning: Coercing text to numeric in E8661 / R8661C5: '2'
## Warning: Coercing text to numeric in E8662 / R8662C5: '2'
## Warning: Coercing text to numeric in E8663 / R8663C5: '2'
## Warning: Coercing text to numeric in E8664 / R8664C5: '2'
## Warning: Coercing text to numeric in E8665 / R8665C5: '2'
## Warning: Coercing text to numeric in E8666 / R8666C5: '1'
## Warning: Coercing text to numeric in E8667 / R8667C5: '1'
## Warning: Coercing text to numeric in E8668 / R8668C5: '1'
## Warning: Coercing text to numeric in E8669 / R8669C5: '1'
## Warning: Coercing text to numeric in E8670 / R8670C5: '1'
## Warning: Coercing text to numeric in E8671 / R8671C5: '1'
## Warning: Coercing text to numeric in E8672 / R8672C5: '1'
## Warning: Coercing text to numeric in E8673 / R8673C5: '1'
## Warning: Coercing text to numeric in E8674 / R8674C5: '1'
## Warning: Coercing text to numeric in E8675 / R8675C5: '1'
## Warning: Coercing text to numeric in E8676 / R8676C5: '1'
## Warning: Coercing text to numeric in E8677 / R8677C5: '1'
## Warning: Coercing text to numeric in E8678 / R8678C5: '2'
## Warning: Coercing text to numeric in E8679 / R8679C5: '2'
## Warning: Coercing text to numeric in E8680 / R8680C5: '2'
## Warning: Coercing text to numeric in E8681 / R8681C5: '2'
## Warning: Coercing text to numeric in E8682 / R8682C5: '2'
## Warning: Coercing text to numeric in E8683 / R8683C5: '2'
## Warning: Coercing text to numeric in E8684 / R8684C5: '2'
## Warning: Coercing text to numeric in E8685 / R8685C5: '2'
## Warning: Coercing text to numeric in E8686 / R8686C5: '2'
## Warning: Coercing text to numeric in E8687 / R8687C5: '2'
## Warning: Coercing text to numeric in E8688 / R8688C5: '2'
## Warning: Coercing text to numeric in E8689 / R8689C5: '2'
## Warning: Coercing text to numeric in E8690 / R8690C5: '1'
## Warning: Coercing text to numeric in E8691 / R8691C5: '1'
## Warning: Coercing text to numeric in E8692 / R8692C5: '1'
## Warning: Coercing text to numeric in E8693 / R8693C5: '1'
## Warning: Coercing text to numeric in E8694 / R8694C5: '1'
## Warning: Coercing text to numeric in E8695 / R8695C5: '1'
## Warning: Coercing text to numeric in E8696 / R8696C5: '1'
## Warning: Coercing text to numeric in E8697 / R8697C5: '1'
## Warning: Coercing text to numeric in E8698 / R8698C5: '1'
## Warning: Coercing text to numeric in E8699 / R8699C5: '1'
## Warning: Coercing text to numeric in E8700 / R8700C5: '1'
## Warning: Coercing text to numeric in E8701 / R8701C5: '1'
## Warning: Coercing text to numeric in E8702 / R8702C5: '2'
## Warning: Coercing text to numeric in E8703 / R8703C5: '2'
## Warning: Coercing text to numeric in E8704 / R8704C5: '2'
## Warning: Coercing text to numeric in E8705 / R8705C5: '2'
## Warning: Coercing text to numeric in E8706 / R8706C5: '2'
## Warning: Coercing text to numeric in E8707 / R8707C5: '2'
## Warning: Coercing text to numeric in E8708 / R8708C5: '1'
## Warning: Coercing text to numeric in E8709 / R8709C5: '1'
## Warning: Coercing text to numeric in E8710 / R8710C5: '1'
## Warning: Coercing text to numeric in E8711 / R8711C5: '1'
## Warning: Coercing text to numeric in E8712 / R8712C5: '1'
## Warning: Coercing text to numeric in E8713 / R8713C5: '1'
## Warning: Coercing text to numeric in E8714 / R8714C5: '2'
## Warning: Coercing text to numeric in E8715 / R8715C5: '2'
## Warning: Coercing text to numeric in E8716 / R8716C5: '2'
## Warning: Coercing text to numeric in E8717 / R8717C5: '2'
## Warning: Coercing text to numeric in E8718 / R8718C5: '2'
## Warning: Coercing text to numeric in E8719 / R8719C5: '2'
## Warning: Coercing text to numeric in E8720 / R8720C5: '1'
## Warning: Coercing text to numeric in E8721 / R8721C5: '1'
## Warning: Coercing text to numeric in E8722 / R8722C5: '1'
## Warning: Coercing text to numeric in E8723 / R8723C5: '1'
## Warning: Coercing text to numeric in E8724 / R8724C5: '1'
## Warning: Coercing text to numeric in E8725 / R8725C5: '1'
## Warning: Coercing text to numeric in E8726 / R8726C5: '2'
## Warning: Coercing text to numeric in E8727 / R8727C5: '2'
## Warning: Coercing text to numeric in E8728 / R8728C5: '2'
## Warning: Coercing text to numeric in E8729 / R8729C5: '2'
## Warning: Coercing text to numeric in E8730 / R8730C5: '2'
## Warning: Coercing text to numeric in E8731 / R8731C5: '2'
## Warning: Coercing text to numeric in E8732 / R8732C5: '2'
## Warning: Coercing text to numeric in E8733 / R8733C5: '2'
## Warning: Coercing text to numeric in E8734 / R8734C5: '2'
## Warning: Coercing text to numeric in E8735 / R8735C5: '2'
## Warning: Coercing text to numeric in E8736 / R8736C5: '2'
## Warning: Coercing text to numeric in E8737 / R8737C5: '2'
## Warning: Coercing text to numeric in E8738 / R8738C5: '2'
## Warning: Coercing text to numeric in E8739 / R8739C5: '2'
## Warning: Coercing text to numeric in E8740 / R8740C5: '2'
## Warning: Coercing text to numeric in E8741 / R8741C5: '2'
## Warning: Coercing text to numeric in E8742 / R8742C5: '2'
## Warning: Coercing text to numeric in E8743 / R8743C5: '2'
## Warning: Coercing text to numeric in E8744 / R8744C5: '2'
## Warning: Coercing text to numeric in E8745 / R8745C5: '2'
## Warning: Coercing text to numeric in E8746 / R8746C5: '2'
## Warning: Coercing text to numeric in E8747 / R8747C5: '2'
## Warning: Coercing text to numeric in E8748 / R8748C5: '2'
## Warning: Coercing text to numeric in E8749 / R8749C5: '2'
## Warning: Coercing text to numeric in E8750 / R8750C5: '1'
## Warning: Coercing text to numeric in E8751 / R8751C5: '1'
## Warning: Coercing text to numeric in E8752 / R8752C5: '1'
## Warning: Coercing text to numeric in E8753 / R8753C5: '1'
## Warning: Coercing text to numeric in E8754 / R8754C5: '1'
## Warning: Coercing text to numeric in E8755 / R8755C5: '1'
## Warning: Coercing text to numeric in E8756 / R8756C5: '2'
## Warning: Coercing text to numeric in E8757 / R8757C5: '2'
## Warning: Coercing text to numeric in E8758 / R8758C5: '2'
## Warning: Coercing text to numeric in E8759 / R8759C5: '2'
## Warning: Coercing text to numeric in E8760 / R8760C5: '2'
## Warning: Coercing text to numeric in E8761 / R8761C5: '2'
## Warning: Coercing text to numeric in E8762 / R8762C5: '1'
## Warning: Coercing text to numeric in E8763 / R8763C5: '1'
## Warning: Coercing text to numeric in E8764 / R8764C5: '1'
## Warning: Coercing text to numeric in E8765 / R8765C5: '1'
## Warning: Coercing text to numeric in E8766 / R8766C5: '1'
## Warning: Coercing text to numeric in E8767 / R8767C5: '1'
## Warning: Coercing text to numeric in E8768 / R8768C5: '2'
## Warning: Coercing text to numeric in E8769 / R8769C5: '2'
## Warning: Coercing text to numeric in E8770 / R8770C5: '2'
## Warning: Coercing text to numeric in E8771 / R8771C5: '2'
## Warning: Coercing text to numeric in E8772 / R8772C5: '2'
## Warning: Coercing text to numeric in E8773 / R8773C5: '2'
## Warning: Coercing text to numeric in E8774 / R8774C5: '2'
## Warning: Coercing text to numeric in E8775 / R8775C5: '2'
## Warning: Coercing text to numeric in E8776 / R8776C5: '2'
## Warning: Coercing text to numeric in E8777 / R8777C5: '2'
## Warning: Coercing text to numeric in E8778 / R8778C5: '2'
## Warning: Coercing text to numeric in E8779 / R8779C5: '2'
## Warning: Coercing text to numeric in E8780 / R8780C5: '2'
## Warning: Coercing text to numeric in E8781 / R8781C5: '2'
## Warning: Coercing text to numeric in E8782 / R8782C5: '2'
## Warning: Coercing text to numeric in E8783 / R8783C5: '2'
## Warning: Coercing text to numeric in E8784 / R8784C5: '2'
## Warning: Coercing text to numeric in E8785 / R8785C5: '2'
## Warning: Coercing text to numeric in E8786 / R8786C5: '2'
## Warning: Coercing text to numeric in E8787 / R8787C5: '2'
## Warning: Coercing text to numeric in E8788 / R8788C5: '2'
## Warning: Coercing text to numeric in E8789 / R8789C5: '2'
## Warning: Coercing text to numeric in E8790 / R8790C5: '2'
## Warning: Coercing text to numeric in E8791 / R8791C5: '2'
## Warning: Coercing text to numeric in E8792 / R8792C5: '1'
## Warning: Coercing text to numeric in E8793 / R8793C5: '1'
## Warning: Coercing text to numeric in E8794 / R8794C5: '1'
## Warning: Coercing text to numeric in E8795 / R8795C5: '1'
## Warning: Coercing text to numeric in E8796 / R8796C5: '1'
## Warning: Coercing text to numeric in E8797 / R8797C5: '1'
## Warning: Coercing text to numeric in E8798 / R8798C5: '1'
## Warning: Coercing text to numeric in E8799 / R8799C5: '1'
## Warning: Coercing text to numeric in E8800 / R8800C5: '1'
## Warning: Coercing text to numeric in E8801 / R8801C5: '1'
## Warning: Coercing text to numeric in E8802 / R8802C5: '1'
## Warning: Coercing text to numeric in E8803 / R8803C5: '1'
## Warning: Coercing text to numeric in E8804 / R8804C5: '1'
## Warning: Coercing text to numeric in E8805 / R8805C5: '1'
## Warning: Coercing text to numeric in E8806 / R8806C5: '1'
## Warning: Coercing text to numeric in E8807 / R8807C5: '1'
## Warning: Coercing text to numeric in E8808 / R8808C5: '1'
## Warning: Coercing text to numeric in E8809 / R8809C5: '1'
## Warning: Coercing text to numeric in E8810 / R8810C5: '1'
## Warning: Coercing text to numeric in E8811 / R8811C5: '1'
## Warning: Coercing text to numeric in E8812 / R8812C5: '1'
## Warning: Coercing text to numeric in E8813 / R8813C5: '1'
## Warning: Coercing text to numeric in E8814 / R8814C5: '1'
## Warning: Coercing text to numeric in E8815 / R8815C5: '1'
## Warning: Coercing text to numeric in E8816 / R8816C5: '1'
## Warning: Coercing text to numeric in E8817 / R8817C5: '1'
## Warning: Coercing text to numeric in E8818 / R8818C5: '1'
## Warning: Coercing text to numeric in E8819 / R8819C5: '1'
## Warning: Coercing text to numeric in E8820 / R8820C5: '1'
## Warning: Coercing text to numeric in E8821 / R8821C5: '1'
## Warning: Coercing text to numeric in E8822 / R8822C5: '2'
## Warning: Coercing text to numeric in E8823 / R8823C5: '2'
## Warning: Coercing text to numeric in E8824 / R8824C5: '2'
## Warning: Coercing text to numeric in E8825 / R8825C5: '2'
## Warning: Coercing text to numeric in E8826 / R8826C5: '2'
## Warning: Coercing text to numeric in E8827 / R8827C5: '2'
## Warning: Coercing text to numeric in E8828 / R8828C5: '1'
## Warning: Coercing text to numeric in E8829 / R8829C5: '1'
## Warning: Coercing text to numeric in E8830 / R8830C5: '1'
## Warning: Coercing text to numeric in E8831 / R8831C5: '1'
## Warning: Coercing text to numeric in E8832 / R8832C5: '1'
## Warning: Coercing text to numeric in E8833 / R8833C5: '1'
## Warning: Coercing text to numeric in E8834 / R8834C5: '1'
## Warning: Coercing text to numeric in E8835 / R8835C5: '1'
## Warning: Coercing text to numeric in E8836 / R8836C5: '1'
## Warning: Coercing text to numeric in E8837 / R8837C5: '1'
## Warning: Coercing text to numeric in E8838 / R8838C5: '1'
## Warning: Coercing text to numeric in E8839 / R8839C5: '1'
## Warning: Coercing text to numeric in E8840 / R8840C5: '2'
## Warning: Coercing text to numeric in E8841 / R8841C5: '2'
## Warning: Coercing text to numeric in E8842 / R8842C5: '2'
## Warning: Coercing text to numeric in E8843 / R8843C5: '2'
## Warning: Coercing text to numeric in E8844 / R8844C5: '2'
## Warning: Coercing text to numeric in E8845 / R8845C5: '2'
## Warning: Coercing text to numeric in E8846 / R8846C5: '2'
## Warning: Coercing text to numeric in E8847 / R8847C5: '2'
## Warning: Coercing text to numeric in E8848 / R8848C5: '2'
## Warning: Coercing text to numeric in E8849 / R8849C5: '2'
## Warning: Coercing text to numeric in E8850 / R8850C5: '2'
## Warning: Coercing text to numeric in E8851 / R8851C5: '2'
## Warning: Coercing text to numeric in E8852 / R8852C5: '2'
## Warning: Coercing text to numeric in E8853 / R8853C5: '2'
## Warning: Coercing text to numeric in E8854 / R8854C5: '2'
## Warning: Coercing text to numeric in E8855 / R8855C5: '2'
## Warning: Coercing text to numeric in E8856 / R8856C5: '2'
## Warning: Coercing text to numeric in E8857 / R8857C5: '2'
## Warning: Coercing text to numeric in E8858 / R8858C5: '1'
## Warning: Coercing text to numeric in E8859 / R8859C5: '1'
## Warning: Coercing text to numeric in E8860 / R8860C5: '1'
## Warning: Coercing text to numeric in E8861 / R8861C5: '1'
## Warning: Coercing text to numeric in E8862 / R8862C5: '1'
## Warning: Coercing text to numeric in E8863 / R8863C5: '1'
## Warning: Coercing text to numeric in E8864 / R8864C5: '2'
## Warning: Coercing text to numeric in E8865 / R8865C5: '2'
## Warning: Coercing text to numeric in E8866 / R8866C5: '2'
## Warning: Coercing text to numeric in E8867 / R8867C5: '2'
## Warning: Coercing text to numeric in E8868 / R8868C5: '2'
## Warning: Coercing text to numeric in E8869 / R8869C5: '2'
## Warning: Coercing text to numeric in E8870 / R8870C5: '2'
## Warning: Coercing text to numeric in E8871 / R8871C5: '2'
## Warning: Coercing text to numeric in E8872 / R8872C5: '2'
## Warning: Coercing text to numeric in E8873 / R8873C5: '2'
## Warning: Coercing text to numeric in E8874 / R8874C5: '2'
## Warning: Coercing text to numeric in E8875 / R8875C5: '2'
## Warning: Coercing text to numeric in E8876 / R8876C5: '1'
## Warning: Coercing text to numeric in E8877 / R8877C5: '1'
## Warning: Coercing text to numeric in E8878 / R8878C5: '1'
## Warning: Coercing text to numeric in E8879 / R8879C5: '1'
## Warning: Coercing text to numeric in E8880 / R8880C5: '1'
## Warning: Coercing text to numeric in E8881 / R8881C5: '1'
## Warning: Coercing text to numeric in E8882 / R8882C5: '1'
## Warning: Coercing text to numeric in E8883 / R8883C5: '1'
## Warning: Coercing text to numeric in E8884 / R8884C5: '1'
## Warning: Coercing text to numeric in E8885 / R8885C5: '1'
## Warning: Coercing text to numeric in E8886 / R8886C5: '1'
## Warning: Coercing text to numeric in E8887 / R8887C5: '1'
## Warning: Coercing text to numeric in E8888 / R8888C5: '1'
## Warning: Coercing text to numeric in E8889 / R8889C5: '1'
## Warning: Coercing text to numeric in E8890 / R8890C5: '1'
## Warning: Coercing text to numeric in E8891 / R8891C5: '1'
## Warning: Coercing text to numeric in E8892 / R8892C5: '1'
## Warning: Coercing text to numeric in E8893 / R8893C5: '1'
## Warning: Coercing text to numeric in E8894 / R8894C5: '2'
## Warning: Coercing text to numeric in E8895 / R8895C5: '2'
## Warning: Coercing text to numeric in E8896 / R8896C5: '2'
## Warning: Coercing text to numeric in E8897 / R8897C5: '2'
## Warning: Coercing text to numeric in E8898 / R8898C5: '2'
## Warning: Coercing text to numeric in E8899 / R8899C5: '2'
## Warning: Coercing text to numeric in E8900 / R8900C5: '2'
## Warning: Coercing text to numeric in E8901 / R8901C5: '2'
## Warning: Coercing text to numeric in E8902 / R8902C5: '2'
## Warning: Coercing text to numeric in E8903 / R8903C5: '2'
## Warning: Coercing text to numeric in E8904 / R8904C5: '2'
## Warning: Coercing text to numeric in E8905 / R8905C5: '2'
## Warning: Coercing text to numeric in E8906 / R8906C5: '1'
## Warning: Coercing text to numeric in E8907 / R8907C5: '1'
## Warning: Coercing text to numeric in E8908 / R8908C5: '1'
## Warning: Coercing text to numeric in E8909 / R8909C5: '1'
## Warning: Coercing text to numeric in E8910 / R8910C5: '1'
## Warning: Coercing text to numeric in E8911 / R8911C5: '1'
## Warning: Coercing text to numeric in E8912 / R8912C5: '2'
## Warning: Coercing text to numeric in E8913 / R8913C5: '2'
## Warning: Coercing text to numeric in E8914 / R8914C5: '2'
## Warning: Coercing text to numeric in E8915 / R8915C5: '2'
## Warning: Coercing text to numeric in E8916 / R8916C5: '2'
## Warning: Coercing text to numeric in E8917 / R8917C5: '2'
## Warning: Coercing text to numeric in E8918 / R8918C5: '1'
## Warning: Coercing text to numeric in E8919 / R8919C5: '1'
## Warning: Coercing text to numeric in E8920 / R8920C5: '1'
## Warning: Coercing text to numeric in E8921 / R8921C5: '1'
## Warning: Coercing text to numeric in E8922 / R8922C5: '1'
## Warning: Coercing text to numeric in E8923 / R8923C5: '1'
## Warning: Coercing text to numeric in E8924 / R8924C5: '1'
## Warning: Coercing text to numeric in E8925 / R8925C5: '1'
## Warning: Coercing text to numeric in E8926 / R8926C5: '1'
## Warning: Coercing text to numeric in E8927 / R8927C5: '1'
## Warning: Coercing text to numeric in E8928 / R8928C5: '1'
## Warning: Coercing text to numeric in E8929 / R8929C5: '1'
## Warning: Coercing text to numeric in E8930 / R8930C5: '2'
## Warning: Coercing text to numeric in E8931 / R8931C5: '2'
## Warning: Coercing text to numeric in E8932 / R8932C5: '2'
## Warning: Coercing text to numeric in E8933 / R8933C5: '2'
## Warning: Coercing text to numeric in E8934 / R8934C5: '2'
## Warning: Coercing text to numeric in E8935 / R8935C5: '2'
## Warning: Coercing text to numeric in E8936 / R8936C5: '2'
## Warning: Coercing text to numeric in E8937 / R8937C5: '2'
## Warning: Coercing text to numeric in E8938 / R8938C5: '2'
## Warning: Coercing text to numeric in E8939 / R8939C5: '2'
## Warning: Coercing text to numeric in E8940 / R8940C5: '2'
## Warning: Coercing text to numeric in E8941 / R8941C5: '2'
## Warning: Coercing text to numeric in E8942 / R8942C5: '1'
## Warning: Coercing text to numeric in E8943 / R8943C5: '1'
## Warning: Coercing text to numeric in E8944 / R8944C5: '1'
## Warning: Coercing text to numeric in E8945 / R8945C5: '1'
## Warning: Coercing text to numeric in E8946 / R8946C5: '1'
## Warning: Coercing text to numeric in E8947 / R8947C5: '1'
## Warning: Coercing text to numeric in E8948 / R8948C5: '1'
## Warning: Coercing text to numeric in E8949 / R8949C5: '1'
## Warning: Coercing text to numeric in E8950 / R8950C5: '1'
## Warning: Coercing text to numeric in E8951 / R8951C5: '1'
## Warning: Coercing text to numeric in E8952 / R8952C5: '1'
## Warning: Coercing text to numeric in E8953 / R8953C5: '1'
## Warning: Coercing text to numeric in E8954 / R8954C5: '1'
## Warning: Coercing text to numeric in E8955 / R8955C5: '1'
## Warning: Coercing text to numeric in E8956 / R8956C5: '1'
## Warning: Coercing text to numeric in E8957 / R8957C5: '1'
## Warning: Coercing text to numeric in E8958 / R8958C5: '1'
## Warning: Coercing text to numeric in E8959 / R8959C5: '1'
## Warning: Coercing text to numeric in E8960 / R8960C5: '1'
## Warning: Coercing text to numeric in E8961 / R8961C5: '1'
## Warning: Coercing text to numeric in E8962 / R8962C5: '1'
## Warning: Coercing text to numeric in E8963 / R8963C5: '1'
## Warning: Coercing text to numeric in E8964 / R8964C5: '1'
## Warning: Coercing text to numeric in E8965 / R8965C5: '1'
## Warning: Coercing text to numeric in E8966 / R8966C5: '1'
## Warning: Coercing text to numeric in E8967 / R8967C5: '1'
## Warning: Coercing text to numeric in E8968 / R8968C5: '1'
## Warning: Coercing text to numeric in E8969 / R8969C5: '1'
## Warning: Coercing text to numeric in E8970 / R8970C5: '1'
## Warning: Coercing text to numeric in E8971 / R8971C5: '1'
## Warning: Coercing text to numeric in E8972 / R8972C5: '1'
## Warning: Coercing text to numeric in E8973 / R8973C5: '1'
## Warning: Coercing text to numeric in E8974 / R8974C5: '1'
## Warning: Coercing text to numeric in E8975 / R8975C5: '1'
## Warning: Coercing text to numeric in E8976 / R8976C5: '1'
## Warning: Coercing text to numeric in E8977 / R8977C5: '1'
## Warning: Coercing text to numeric in E8978 / R8978C5: '1'
## Warning: Coercing text to numeric in E8979 / R8979C5: '1'
## Warning: Coercing text to numeric in E8980 / R8980C5: '1'
## Warning: Coercing text to numeric in E8981 / R8981C5: '1'
## Warning: Coercing text to numeric in E8982 / R8982C5: '1'
## Warning: Coercing text to numeric in E8983 / R8983C5: '1'
## Warning: Coercing text to numeric in E8984 / R8984C5: '1'
## Warning: Coercing text to numeric in E8985 / R8985C5: '1'
## Warning: Coercing text to numeric in E8986 / R8986C5: '1'
## Warning: Coercing text to numeric in E8987 / R8987C5: '1'
## Warning: Coercing text to numeric in E8988 / R8988C5: '1'
## Warning: Coercing text to numeric in E8989 / R8989C5: '1'
## Warning: Coercing text to numeric in E8990 / R8990C5: '2'
## Warning: Coercing text to numeric in E8991 / R8991C5: '2'
## Warning: Coercing text to numeric in E8992 / R8992C5: '2'
## Warning: Coercing text to numeric in E8993 / R8993C5: '2'
## Warning: Coercing text to numeric in E8994 / R8994C5: '2'
## Warning: Coercing text to numeric in E8995 / R8995C5: '2'
## Warning: Coercing text to numeric in E8996 / R8996C5: '2'
## Warning: Coercing text to numeric in E8997 / R8997C5: '2'
## Warning: Coercing text to numeric in E8998 / R8998C5: '2'
## Warning: Coercing text to numeric in E8999 / R8999C5: '2'
## Warning: Coercing text to numeric in E9000 / R9000C5: '2'
## Warning: Coercing text to numeric in E9001 / R9001C5: '2'
## Warning: Coercing text to numeric in E9002 / R9002C5: '1'
## Warning: Coercing text to numeric in E9003 / R9003C5: '1'
## Warning: Coercing text to numeric in E9004 / R9004C5: '1'
## Warning: Coercing text to numeric in E9005 / R9005C5: '1'
## Warning: Coercing text to numeric in E9006 / R9006C5: '1'
## Warning: Coercing text to numeric in E9007 / R9007C5: '1'
## Warning: Coercing text to numeric in E9008 / R9008C5: '2'
## Warning: Coercing text to numeric in E9009 / R9009C5: '2'
## Warning: Coercing text to numeric in E9010 / R9010C5: '2'
## Warning: Coercing text to numeric in E9011 / R9011C5: '2'
## Warning: Coercing text to numeric in E9012 / R9012C5: '2'
## Warning: Coercing text to numeric in E9013 / R9013C5: '2'
## Warning: Coercing text to numeric in E9014 / R9014C5: '1'
## Warning: Coercing text to numeric in E9015 / R9015C5: '1'
## Warning: Coercing text to numeric in E9016 / R9016C5: '1'
## Warning: Coercing text to numeric in E9017 / R9017C5: '1'
## Warning: Coercing text to numeric in E9018 / R9018C5: '1'
## Warning: Coercing text to numeric in E9019 / R9019C5: '1'
## Warning: Coercing text to numeric in E9020 / R9020C5: '1'
## Warning: Coercing text to numeric in E9021 / R9021C5: '1'
## Warning: Coercing text to numeric in E9022 / R9022C5: '1'
## Warning: Coercing text to numeric in E9023 / R9023C5: '1'
## Warning: Coercing text to numeric in E9024 / R9024C5: '1'
## Warning: Coercing text to numeric in E9025 / R9025C5: '1'
## Warning: Coercing text to numeric in E9026 / R9026C5: '1'
## Warning: Coercing text to numeric in E9027 / R9027C5: '1'
## Warning: Coercing text to numeric in E9028 / R9028C5: '1'
## Warning: Coercing text to numeric in E9029 / R9029C5: '1'
## Warning: Coercing text to numeric in E9030 / R9030C5: '1'
## Warning: Coercing text to numeric in E9031 / R9031C5: '1'
## Warning: Coercing text to numeric in E9032 / R9032C5: '2'
## Warning: Coercing text to numeric in E9033 / R9033C5: '2'
## Warning: Coercing text to numeric in E9034 / R9034C5: '2'
## Warning: Coercing text to numeric in E9035 / R9035C5: '2'
## Warning: Coercing text to numeric in E9036 / R9036C5: '2'
## Warning: Coercing text to numeric in E9037 / R9037C5: '2'
## Warning: Coercing text to numeric in E9038 / R9038C5: '2'
## Warning: Coercing text to numeric in E9039 / R9039C5: '2'
## Warning: Coercing text to numeric in E9040 / R9040C5: '2'
## Warning: Coercing text to numeric in E9041 / R9041C5: '2'
## Warning: Coercing text to numeric in E9042 / R9042C5: '2'
## Warning: Coercing text to numeric in E9043 / R9043C5: '2'
## Warning: Coercing text to numeric in E9044 / R9044C5: '2'
## Warning: Coercing text to numeric in E9045 / R9045C5: '2'
## Warning: Coercing text to numeric in E9046 / R9046C5: '2'
## Warning: Coercing text to numeric in E9047 / R9047C5: '2'
## Warning: Coercing text to numeric in E9048 / R9048C5: '2'
## Warning: Coercing text to numeric in E9049 / R9049C5: '2'
## Warning: Coercing text to numeric in E9050 / R9050C5: '2'
## Warning: Coercing text to numeric in E9051 / R9051C5: '2'
## Warning: Coercing text to numeric in E9052 / R9052C5: '2'
## Warning: Coercing text to numeric in E9053 / R9053C5: '2'
## Warning: Coercing text to numeric in E9054 / R9054C5: '2'
## Warning: Coercing text to numeric in E9055 / R9055C5: '2'
## Warning: Coercing text to numeric in E9056 / R9056C5: '2'
## Warning: Coercing text to numeric in E9057 / R9057C5: '2'
## Warning: Coercing text to numeric in E9058 / R9058C5: '2'
## Warning: Coercing text to numeric in E9059 / R9059C5: '2'
## Warning: Coercing text to numeric in E9060 / R9060C5: '2'
## Warning: Coercing text to numeric in E9061 / R9061C5: '2'
## Warning: Coercing text to numeric in E9062 / R9062C5: '2'
## Warning: Coercing text to numeric in E9063 / R9063C5: '2'
## Warning: Coercing text to numeric in E9064 / R9064C5: '2'
## Warning: Coercing text to numeric in E9065 / R9065C5: '2'
## Warning: Coercing text to numeric in E9066 / R9066C5: '2'
## Warning: Coercing text to numeric in E9067 / R9067C5: '2'
## Warning: Coercing text to numeric in E9068 / R9068C5: '2'
## Warning: Coercing text to numeric in E9069 / R9069C5: '2'
## Warning: Coercing text to numeric in E9070 / R9070C5: '2'
## Warning: Coercing text to numeric in E9071 / R9071C5: '2'
## Warning: Coercing text to numeric in E9072 / R9072C5: '2'
## Warning: Coercing text to numeric in E9073 / R9073C5: '2'
## Warning: Coercing text to numeric in E9074 / R9074C5: '2'
## Warning: Coercing text to numeric in E9075 / R9075C5: '2'
## Warning: Coercing text to numeric in E9076 / R9076C5: '2'
## Warning: Coercing text to numeric in E9077 / R9077C5: '2'
## Warning: Coercing text to numeric in E9078 / R9078C5: '2'
## Warning: Coercing text to numeric in E9079 / R9079C5: '2'
## Warning: Coercing text to numeric in E9080 / R9080C5: '2'
## Warning: Coercing text to numeric in E9081 / R9081C5: '2'
## Warning: Coercing text to numeric in E9082 / R9082C5: '2'
## Warning: Coercing text to numeric in E9083 / R9083C5: '2'
## Warning: Coercing text to numeric in E9084 / R9084C5: '2'
## Warning: Coercing text to numeric in E9085 / R9085C5: '2'
## Warning: Coercing text to numeric in E9086 / R9086C5: '2'
## Warning: Coercing text to numeric in E9087 / R9087C5: '2'
## Warning: Coercing text to numeric in E9088 / R9088C5: '2'
## Warning: Coercing text to numeric in E9089 / R9089C5: '2'
## Warning: Coercing text to numeric in E9090 / R9090C5: '2'
## Warning: Coercing text to numeric in E9091 / R9091C5: '2'
## Warning: Coercing text to numeric in E9092 / R9092C5: '2'
## Warning: Coercing text to numeric in E9093 / R9093C5: '2'
## Warning: Coercing text to numeric in E9094 / R9094C5: '2'
## Warning: Coercing text to numeric in E9095 / R9095C5: '2'
## Warning: Coercing text to numeric in E9096 / R9096C5: '2'
## Warning: Coercing text to numeric in E9097 / R9097C5: '2'
## Warning: Coercing text to numeric in E9098 / R9098C5: '2'
## Warning: Coercing text to numeric in E9099 / R9099C5: '2'
## Warning: Coercing text to numeric in E9100 / R9100C5: '2'
## Warning: Coercing text to numeric in E9101 / R9101C5: '2'
## Warning: Coercing text to numeric in E9102 / R9102C5: '2'
## Warning: Coercing text to numeric in E9103 / R9103C5: '2'
## Warning: Coercing text to numeric in E9104 / R9104C5: '2'
## Warning: Coercing text to numeric in E9105 / R9105C5: '2'
## Warning: Coercing text to numeric in E9106 / R9106C5: '2'
## Warning: Coercing text to numeric in E9107 / R9107C5: '2'
## Warning: Coercing text to numeric in E9108 / R9108C5: '2'
## Warning: Coercing text to numeric in E9109 / R9109C5: '2'
## Warning: Coercing text to numeric in E9110 / R9110C5: '2'
## Warning: Coercing text to numeric in E9111 / R9111C5: '2'
## Warning: Coercing text to numeric in E9112 / R9112C5: '2'
## Warning: Coercing text to numeric in E9113 / R9113C5: '2'
## Warning: Coercing text to numeric in E9114 / R9114C5: '2'
## Warning: Coercing text to numeric in E9115 / R9115C5: '2'
## Warning: Coercing text to numeric in E9116 / R9116C5: '1'
## Warning: Coercing text to numeric in E9117 / R9117C5: '1'
## Warning: Coercing text to numeric in E9118 / R9118C5: '1'
## Warning: Coercing text to numeric in E9119 / R9119C5: '1'
## Warning: Coercing text to numeric in E9120 / R9120C5: '1'
## Warning: Coercing text to numeric in E9121 / R9121C5: '1'
## Warning: Coercing text to numeric in E9122 / R9122C5: '1'
## Warning: Coercing text to numeric in E9123 / R9123C5: '1'
## Warning: Coercing text to numeric in E9124 / R9124C5: '1'
## Warning: Coercing text to numeric in E9125 / R9125C5: '1'
## Warning: Coercing text to numeric in E9126 / R9126C5: '1'
## Warning: Coercing text to numeric in E9127 / R9127C5: '1'
## Warning: Coercing text to numeric in E9128 / R9128C5: '1'
## Warning: Coercing text to numeric in E9129 / R9129C5: '1'
## Warning: Coercing text to numeric in E9130 / R9130C5: '1'
## Warning: Coercing text to numeric in E9131 / R9131C5: '1'
## Warning: Coercing text to numeric in E9132 / R9132C5: '1'
## Warning: Coercing text to numeric in E9133 / R9133C5: '1'
## Warning: Coercing text to numeric in E9134 / R9134C5: '2'
## Warning: Coercing text to numeric in E9135 / R9135C5: '2'
## Warning: Coercing text to numeric in E9136 / R9136C5: '2'
## Warning: Coercing text to numeric in E9137 / R9137C5: '2'
## Warning: Coercing text to numeric in E9138 / R9138C5: '2'
## Warning: Coercing text to numeric in E9139 / R9139C5: '2'
## Warning: Coercing text to numeric in E9140 / R9140C5: '2'
## Warning: Coercing text to numeric in E9141 / R9141C5: '2'
## Warning: Coercing text to numeric in E9142 / R9142C5: '2'
## Warning: Coercing text to numeric in E9143 / R9143C5: '2'
## Warning: Coercing text to numeric in E9144 / R9144C5: '2'
## Warning: Coercing text to numeric in E9145 / R9145C5: '2'
## Warning: Coercing text to numeric in E9146 / R9146C5: '1'
## Warning: Coercing text to numeric in E9147 / R9147C5: '1'
## Warning: Coercing text to numeric in E9148 / R9148C5: '1'
## Warning: Coercing text to numeric in E9149 / R9149C5: '1'
## Warning: Coercing text to numeric in E9150 / R9150C5: '1'
## Warning: Coercing text to numeric in E9151 / R9151C5: '1'
## Warning: Coercing text to numeric in E9152 / R9152C5: '1'
## Warning: Coercing text to numeric in E9153 / R9153C5: '1'
## Warning: Coercing text to numeric in E9154 / R9154C5: '1'
## Warning: Coercing text to numeric in E9155 / R9155C5: '1'
## Warning: Coercing text to numeric in E9156 / R9156C5: '1'
## Warning: Coercing text to numeric in E9157 / R9157C5: '1'
## Warning: Coercing text to numeric in E9158 / R9158C5: '1'
## Warning: Coercing text to numeric in E9159 / R9159C5: '1'
## Warning: Coercing text to numeric in E9160 / R9160C5: '1'
## Warning: Coercing text to numeric in E9161 / R9161C5: '1'
## Warning: Coercing text to numeric in E9162 / R9162C5: '1'
## Warning: Coercing text to numeric in E9163 / R9163C5: '1'
## Warning: Coercing text to numeric in E9164 / R9164C5: '1'
## Warning: Coercing text to numeric in E9165 / R9165C5: '1'
## Warning: Coercing text to numeric in E9166 / R9166C5: '1'
## Warning: Coercing text to numeric in E9167 / R9167C5: '1'
## Warning: Coercing text to numeric in E9168 / R9168C5: '1'
## Warning: Coercing text to numeric in E9169 / R9169C5: '1'
## Warning: Coercing text to numeric in E9170 / R9170C5: '1'
## Warning: Coercing text to numeric in E9171 / R9171C5: '1'
## Warning: Coercing text to numeric in E9172 / R9172C5: '1'
## Warning: Coercing text to numeric in E9173 / R9173C5: '1'
## Warning: Coercing text to numeric in E9174 / R9174C5: '1'
## Warning: Coercing text to numeric in E9175 / R9175C5: '1'
## Warning: Coercing text to numeric in E9176 / R9176C5: '1'
## Warning: Coercing text to numeric in E9177 / R9177C5: '1'
## Warning: Coercing text to numeric in E9178 / R9178C5: '1'
## Warning: Coercing text to numeric in E9179 / R9179C5: '1'
## Warning: Coercing text to numeric in E9180 / R9180C5: '1'
## Warning: Coercing text to numeric in E9181 / R9181C5: '1'
## Warning: Coercing text to numeric in E9182 / R9182C5: '1'
## Warning: Coercing text to numeric in E9183 / R9183C5: '1'
## Warning: Coercing text to numeric in E9184 / R9184C5: '1'
## Warning: Coercing text to numeric in E9185 / R9185C5: '1'
## Warning: Coercing text to numeric in E9186 / R9186C5: '1'
## Warning: Coercing text to numeric in E9187 / R9187C5: '1'
## Warning: Coercing text to numeric in E9188 / R9188C5: '1'
## Warning: Coercing text to numeric in E9189 / R9189C5: '1'
## Warning: Coercing text to numeric in E9190 / R9190C5: '1'
## Warning: Coercing text to numeric in E9191 / R9191C5: '1'
## Warning: Coercing text to numeric in E9192 / R9192C5: '1'
## Warning: Coercing text to numeric in E9193 / R9193C5: '1'
## Warning: Coercing text to numeric in E9194 / R9194C5: '2'
## Warning: Coercing text to numeric in E9195 / R9195C5: '2'
## Warning: Coercing text to numeric in E9196 / R9196C5: '2'
## Warning: Coercing text to numeric in E9197 / R9197C5: '2'
## Warning: Coercing text to numeric in E9198 / R9198C5: '2'
## Warning: Coercing text to numeric in E9199 / R9199C5: '2'
## Warning: Coercing text to numeric in E9200 / R9200C5: '1'
## Warning: Coercing text to numeric in E9201 / R9201C5: '1'
## Warning: Coercing text to numeric in E9202 / R9202C5: '1'
## Warning: Coercing text to numeric in E9203 / R9203C5: '1'
## Warning: Coercing text to numeric in E9204 / R9204C5: '1'
## Warning: Coercing text to numeric in E9205 / R9205C5: '1'
## Warning: Coercing text to numeric in E9206 / R9206C5: '1'
## Warning: Coercing text to numeric in E9207 / R9207C5: '1'
## Warning: Coercing text to numeric in E9208 / R9208C5: '1'
## Warning: Coercing text to numeric in E9209 / R9209C5: '1'
## Warning: Coercing text to numeric in E9210 / R9210C5: '1'
## Warning: Coercing text to numeric in E9211 / R9211C5: '1'
## Warning: Coercing text to numeric in E9212 / R9212C5: '2'
## Warning: Coercing text to numeric in E9213 / R9213C5: '2'
## Warning: Coercing text to numeric in E9214 / R9214C5: '2'
## Warning: Coercing text to numeric in E9215 / R9215C5: '2'
## Warning: Coercing text to numeric in E9216 / R9216C5: '2'
## Warning: Coercing text to numeric in E9217 / R9217C5: '2'
## Warning: Coercing text to numeric in E9218 / R9218C5: '1'
## Warning: Coercing text to numeric in E9219 / R9219C5: '1'
## Warning: Coercing text to numeric in E9220 / R9220C5: '1'
## Warning: Coercing text to numeric in E9221 / R9221C5: '1'
## Warning: Coercing text to numeric in E9222 / R9222C5: '1'
## Warning: Coercing text to numeric in E9223 / R9223C5: '1'
## Warning: Coercing text to numeric in E9224 / R9224C5: '2'
## Warning: Coercing text to numeric in E9225 / R9225C5: '2'
## Warning: Coercing text to numeric in E9226 / R9226C5: '2'
## Warning: Coercing text to numeric in E9227 / R9227C5: '2'
## Warning: Coercing text to numeric in E9228 / R9228C5: '2'
## Warning: Coercing text to numeric in E9229 / R9229C5: '2'
## Warning: Coercing text to numeric in E9230 / R9230C5: '2'
## Warning: Coercing text to numeric in E9231 / R9231C5: '2'
## Warning: Coercing text to numeric in E9232 / R9232C5: '2'
## Warning: Coercing text to numeric in E9233 / R9233C5: '2'
## Warning: Coercing text to numeric in E9234 / R9234C5: '2'
## Warning: Coercing text to numeric in E9235 / R9235C5: '2'
## Warning: Coercing text to numeric in E9236 / R9236C5: '2'
## Warning: Coercing text to numeric in E9237 / R9237C5: '2'
## Warning: Coercing text to numeric in E9238 / R9238C5: '2'
## Warning: Coercing text to numeric in E9239 / R9239C5: '2'
## Warning: Coercing text to numeric in E9240 / R9240C5: '2'
## Warning: Coercing text to numeric in E9241 / R9241C5: '2'
## Warning: Coercing text to numeric in E9242 / R9242C5: '1'
## Warning: Coercing text to numeric in E9243 / R9243C5: '1'
## Warning: Coercing text to numeric in E9244 / R9244C5: '1'
## Warning: Coercing text to numeric in E9245 / R9245C5: '1'
## Warning: Coercing text to numeric in E9246 / R9246C5: '1'
## Warning: Coercing text to numeric in E9247 / R9247C5: '1'
## Warning: Coercing text to numeric in E9248 / R9248C5: '2'
## Warning: Coercing text to numeric in E9249 / R9249C5: '2'
## Warning: Coercing text to numeric in E9250 / R9250C5: '2'
## Warning: Coercing text to numeric in E9251 / R9251C5: '2'
## Warning: Coercing text to numeric in E9252 / R9252C5: '2'
## Warning: Coercing text to numeric in E9253 / R9253C5: '2'
## Warning: Coercing text to numeric in E9254 / R9254C5: '2'
## Warning: Coercing text to numeric in E9255 / R9255C5: '2'
## Warning: Coercing text to numeric in E9256 / R9256C5: '2'
## Warning: Coercing text to numeric in E9257 / R9257C5: '2'
## Warning: Coercing text to numeric in E9258 / R9258C5: '2'
## Warning: Coercing text to numeric in E9259 / R9259C5: '2'
## Warning: Coercing text to numeric in E9260 / R9260C5: '1'
## Warning: Coercing text to numeric in E9261 / R9261C5: '1'
## Warning: Coercing text to numeric in E9262 / R9262C5: '1'
## Warning: Coercing text to numeric in E9263 / R9263C5: '1'
## Warning: Coercing text to numeric in E9264 / R9264C5: '1'
## Warning: Coercing text to numeric in E9265 / R9265C5: '1'
## Warning: Coercing text to numeric in E9266 / R9266C5: '1'
## Warning: Coercing text to numeric in E9267 / R9267C5: '1'
## Warning: Coercing text to numeric in E9268 / R9268C5: '1'
## Warning: Coercing text to numeric in E9269 / R9269C5: '1'
## Warning: Coercing text to numeric in E9270 / R9270C5: '1'
## Warning: Coercing text to numeric in E9271 / R9271C5: '1'
## Warning: Coercing text to numeric in E9272 / R9272C5: '1'
## Warning: Coercing text to numeric in E9273 / R9273C5: '1'
## Warning: Coercing text to numeric in E9274 / R9274C5: '1'
## Warning: Coercing text to numeric in E9275 / R9275C5: '1'
## Warning: Coercing text to numeric in E9276 / R9276C5: '1'
## Warning: Coercing text to numeric in E9277 / R9277C5: '1'
## Warning: Coercing text to numeric in E9278 / R9278C5: '1'
## Warning: Coercing text to numeric in E9279 / R9279C5: '1'
## Warning: Coercing text to numeric in E9280 / R9280C5: '1'
## Warning: Coercing text to numeric in E9281 / R9281C5: '1'
## Warning: Coercing text to numeric in E9282 / R9282C5: '1'
## Warning: Coercing text to numeric in E9283 / R9283C5: '1'
## Warning: Coercing text to numeric in E9284 / R9284C5: '2'
## Warning: Coercing text to numeric in E9285 / R9285C5: '2'
## Warning: Coercing text to numeric in E9286 / R9286C5: '2'
## Warning: Coercing text to numeric in E9287 / R9287C5: '2'
## Warning: Coercing text to numeric in E9288 / R9288C5: '2'
## Warning: Coercing text to numeric in E9289 / R9289C5: '2'
## Warning: Coercing text to numeric in E9290 / R9290C5: '1'
## Warning: Coercing text to numeric in E9291 / R9291C5: '1'
## Warning: Coercing text to numeric in E9292 / R9292C5: '1'
## Warning: Coercing text to numeric in E9293 / R9293C5: '1'
## Warning: Coercing text to numeric in E9294 / R9294C5: '1'
## Warning: Coercing text to numeric in E9295 / R9295C5: '1'
## Warning: Coercing text to numeric in E9296 / R9296C5: '2'
## Warning: Coercing text to numeric in E9297 / R9297C5: '2'
## Warning: Coercing text to numeric in E9298 / R9298C5: '2'
## Warning: Coercing text to numeric in E9299 / R9299C5: '2'
## Warning: Coercing text to numeric in E9300 / R9300C5: '2'
## Warning: Coercing text to numeric in E9301 / R9301C5: '2'
## Warning: Coercing text to numeric in E9302 / R9302C5: '1'
## Warning: Coercing text to numeric in E9303 / R9303C5: '1'
## Warning: Coercing text to numeric in E9304 / R9304C5: '1'
## Warning: Coercing text to numeric in E9305 / R9305C5: '1'
## Warning: Coercing text to numeric in E9306 / R9306C5: '1'
## Warning: Coercing text to numeric in E9307 / R9307C5: '1'
## Warning: Coercing text to numeric in E9308 / R9308C5: '2'
## Warning: Coercing text to numeric in E9309 / R9309C5: '2'
## Warning: Coercing text to numeric in E9310 / R9310C5: '2'
## Warning: Coercing text to numeric in E9311 / R9311C5: '2'
## Warning: Coercing text to numeric in E9312 / R9312C5: '2'
## Warning: Coercing text to numeric in E9313 / R9313C5: '2'
## Warning: Coercing text to numeric in E9314 / R9314C5: '2'
## Warning: Coercing text to numeric in E9315 / R9315C5: '2'
## Warning: Coercing text to numeric in E9316 / R9316C5: '2'
## Warning: Coercing text to numeric in E9317 / R9317C5: '2'
## Warning: Coercing text to numeric in E9318 / R9318C5: '2'
## Warning: Coercing text to numeric in E9319 / R9319C5: '2'
## Warning: Coercing text to numeric in E9320 / R9320C5: '2'
## Warning: Coercing text to numeric in E9321 / R9321C5: '2'
## Warning: Coercing text to numeric in E9322 / R9322C5: '2'
## Warning: Coercing text to numeric in E9323 / R9323C5: '2'
## Warning: Coercing text to numeric in E9324 / R9324C5: '2'
## Warning: Coercing text to numeric in E9325 / R9325C5: '2'
## Warning: Coercing text to numeric in E9326 / R9326C5: '1'
## Warning: Coercing text to numeric in E9327 / R9327C5: '1'
## Warning: Coercing text to numeric in E9328 / R9328C5: '1'
## Warning: Coercing text to numeric in E9329 / R9329C5: '1'
## Warning: Coercing text to numeric in E9330 / R9330C5: '1'
## Warning: Coercing text to numeric in E9331 / R9331C5: '1'
## Warning: Coercing text to numeric in E9332 / R9332C5: '2'
## Warning: Coercing text to numeric in E9333 / R9333C5: '2'
## Warning: Coercing text to numeric in E9334 / R9334C5: '2'
## Warning: Coercing text to numeric in E9335 / R9335C5: '2'
## Warning: Coercing text to numeric in E9336 / R9336C5: '2'
## Warning: Coercing text to numeric in E9337 / R9337C5: '2'
## Warning: Coercing text to numeric in E9338 / R9338C5: '1'
## Warning: Coercing text to numeric in E9339 / R9339C5: '1'
## Warning: Coercing text to numeric in E9340 / R9340C5: '1'
## Warning: Coercing text to numeric in E9341 / R9341C5: '1'
## Warning: Coercing text to numeric in E9342 / R9342C5: '1'
## Warning: Coercing text to numeric in E9343 / R9343C5: '1'
## Warning: Coercing text to numeric in E9344 / R9344C5: '1'
## Warning: Coercing text to numeric in E9345 / R9345C5: '1'
## Warning: Coercing text to numeric in E9346 / R9346C5: '1'
## Warning: Coercing text to numeric in E9347 / R9347C5: '1'
## Warning: Coercing text to numeric in E9348 / R9348C5: '1'
## Warning: Coercing text to numeric in E9349 / R9349C5: '1'
## Warning: Coercing text to numeric in E9350 / R9350C5: '2'
## Warning: Coercing text to numeric in E9351 / R9351C5: '2'
## Warning: Coercing text to numeric in E9352 / R9352C5: '2'
## Warning: Coercing text to numeric in E9353 / R9353C5: '2'
## Warning: Coercing text to numeric in E9354 / R9354C5: '2'
## Warning: Coercing text to numeric in E9355 / R9355C5: '2'
## Warning: Coercing text to numeric in E9356 / R9356C5: '2'
## Warning: Coercing text to numeric in E9357 / R9357C5: '2'
## Warning: Coercing text to numeric in E9358 / R9358C5: '2'
## Warning: Coercing text to numeric in E9359 / R9359C5: '2'
## Warning: Coercing text to numeric in E9360 / R9360C5: '2'
## Warning: Coercing text to numeric in E9361 / R9361C5: '2'
## Warning: Coercing text to numeric in E9362 / R9362C5: '1'
## Warning: Coercing text to numeric in E9363 / R9363C5: '1'
## Warning: Coercing text to numeric in E9364 / R9364C5: '1'
## Warning: Coercing text to numeric in E9365 / R9365C5: '1'
## Warning: Coercing text to numeric in E9366 / R9366C5: '1'
## Warning: Coercing text to numeric in E9367 / R9367C5: '1'
## Warning: Coercing text to numeric in E9368 / R9368C5: '1'
## Warning: Coercing text to numeric in E9369 / R9369C5: '1'
## Warning: Coercing text to numeric in E9370 / R9370C5: '1'
## Warning: Coercing text to numeric in E9371 / R9371C5: '1'
## Warning: Coercing text to numeric in E9372 / R9372C5: '1'
## Warning: Coercing text to numeric in E9373 / R9373C5: '1'
## Warning: Coercing text to numeric in E9374 / R9374C5: '2'
## Warning: Coercing text to numeric in E9375 / R9375C5: '2'
## Warning: Coercing text to numeric in E9376 / R9376C5: '2'
## Warning: Coercing text to numeric in E9377 / R9377C5: '2'
## Warning: Coercing text to numeric in E9378 / R9378C5: '2'
## Warning: Coercing text to numeric in E9379 / R9379C5: '2'
## Warning: Coercing text to numeric in E9380 / R9380C5: '2'
## Warning: Coercing text to numeric in E9381 / R9381C5: '2'
## Warning: Coercing text to numeric in E9382 / R9382C5: '2'
## Warning: Coercing text to numeric in E9383 / R9383C5: '2'
## Warning: Coercing text to numeric in E9384 / R9384C5: '2'
## Warning: Coercing text to numeric in E9385 / R9385C5: '2'
## Warning: Coercing text to numeric in E9386 / R9386C5: '1'
## Warning: Coercing text to numeric in E9387 / R9387C5: '1'
## Warning: Coercing text to numeric in E9388 / R9388C5: '1'
## Warning: Coercing text to numeric in E9389 / R9389C5: '1'
## Warning: Coercing text to numeric in E9390 / R9390C5: '1'
## Warning: Coercing text to numeric in E9391 / R9391C5: '1'
## Warning: Coercing text to numeric in E9392 / R9392C5: '1'
## Warning: Coercing text to numeric in E9393 / R9393C5: '1'
## Warning: Coercing text to numeric in E9394 / R9394C5: '1'
## Warning: Coercing text to numeric in E9395 / R9395C5: '1'
## Warning: Coercing text to numeric in E9396 / R9396C5: '1'
## Warning: Coercing text to numeric in E9397 / R9397C5: '1'
## Warning: Coercing text to numeric in E9398 / R9398C5: '2'
## Warning: Coercing text to numeric in E9399 / R9399C5: '2'
## Warning: Coercing text to numeric in E9400 / R9400C5: '2'
## Warning: Coercing text to numeric in E9401 / R9401C5: '2'
## Warning: Coercing text to numeric in E9402 / R9402C5: '2'
## Warning: Coercing text to numeric in E9403 / R9403C5: '2'
## Warning: Coercing text to numeric in E9404 / R9404C5: '1'
## Warning: Coercing text to numeric in E9405 / R9405C5: '1'
## Warning: Coercing text to numeric in E9406 / R9406C5: '1'
## Warning: Coercing text to numeric in E9407 / R9407C5: '1'
## Warning: Coercing text to numeric in E9408 / R9408C5: '1'
## Warning: Coercing text to numeric in E9409 / R9409C5: '1'
## Warning: Coercing text to numeric in E9410 / R9410C5: '1'
## Warning: Coercing text to numeric in E9411 / R9411C5: '1'
## Warning: Coercing text to numeric in E9412 / R9412C5: '1'
## Warning: Coercing text to numeric in E9413 / R9413C5: '1'
## Warning: Coercing text to numeric in E9414 / R9414C5: '1'
## Warning: Coercing text to numeric in E9415 / R9415C5: '1'
## Warning: Coercing text to numeric in E9416 / R9416C5: '2'
## Warning: Coercing text to numeric in E9417 / R9417C5: '2'
## Warning: Coercing text to numeric in E9418 / R9418C5: '2'
## Warning: Coercing text to numeric in E9419 / R9419C5: '2'
## Warning: Coercing text to numeric in E9420 / R9420C5: '2'
## Warning: Coercing text to numeric in E9421 / R9421C5: '2'
## Warning: Coercing text to numeric in E9422 / R9422C5: '1'
## Warning: Coercing text to numeric in E9423 / R9423C5: '1'
## Warning: Coercing text to numeric in E9424 / R9424C5: '1'
## Warning: Coercing text to numeric in E9425 / R9425C5: '1'
## Warning: Coercing text to numeric in E9426 / R9426C5: '1'
## Warning: Coercing text to numeric in E9427 / R9427C5: '1'
## Warning: Coercing text to numeric in E9428 / R9428C5: '2'
## Warning: Coercing text to numeric in E9429 / R9429C5: '2'
## Warning: Coercing text to numeric in E9430 / R9430C5: '2'
## Warning: Coercing text to numeric in E9431 / R9431C5: '2'
## Warning: Coercing text to numeric in E9432 / R9432C5: '2'
## Warning: Coercing text to numeric in E9433 / R9433C5: '2'
## Warning: Coercing text to numeric in E9434 / R9434C5: '2'
## Warning: Coercing text to numeric in E9435 / R9435C5: '2'
## Warning: Coercing text to numeric in E9436 / R9436C5: '2'
## Warning: Coercing text to numeric in E9437 / R9437C5: '2'
## Warning: Coercing text to numeric in E9438 / R9438C5: '2'
## Warning: Coercing text to numeric in E9439 / R9439C5: '2'
## Warning: Coercing text to numeric in E9440 / R9440C5: '2'
## Warning: Coercing text to numeric in E9441 / R9441C5: '2'
## Warning: Coercing text to numeric in E9442 / R9442C5: '2'
## Warning: Coercing text to numeric in E9443 / R9443C5: '2'
## Warning: Coercing text to numeric in E9444 / R9444C5: '2'
## Warning: Coercing text to numeric in E9445 / R9445C5: '2'
## Warning: Coercing text to numeric in E9446 / R9446C5: '2'
## Warning: Coercing text to numeric in E9447 / R9447C5: '2'
## Warning: Coercing text to numeric in E9448 / R9448C5: '2'
## Warning: Coercing text to numeric in E9449 / R9449C5: '2'
## Warning: Coercing text to numeric in E9450 / R9450C5: '2'
## Warning: Coercing text to numeric in E9451 / R9451C5: '2'
## Warning: Coercing text to numeric in E9452 / R9452C5: '1'
## Warning: Coercing text to numeric in E9453 / R9453C5: '1'
## Warning: Coercing text to numeric in E9454 / R9454C5: '1'
## Warning: Coercing text to numeric in E9455 / R9455C5: '1'
## Warning: Coercing text to numeric in E9456 / R9456C5: '1'
## Warning: Coercing text to numeric in E9457 / R9457C5: '1'
## Warning: Coercing text to numeric in E9458 / R9458C5: '2'
## Warning: Coercing text to numeric in E9459 / R9459C5: '2'
## Warning: Coercing text to numeric in E9460 / R9460C5: '2'
## Warning: Coercing text to numeric in E9461 / R9461C5: '2'
## Warning: Coercing text to numeric in E9462 / R9462C5: '2'
## Warning: Coercing text to numeric in E9463 / R9463C5: '2'
## Warning: Coercing text to numeric in E9464 / R9464C5: '2'
## Warning: Coercing text to numeric in E9465 / R9465C5: '2'
## Warning: Coercing text to numeric in E9466 / R9466C5: '2'
## Warning: Coercing text to numeric in E9467 / R9467C5: '2'
## Warning: Coercing text to numeric in E9468 / R9468C5: '2'
## Warning: Coercing text to numeric in E9469 / R9469C5: '2'
## Warning: Coercing text to numeric in E9470 / R9470C5: '1'
## Warning: Coercing text to numeric in E9471 / R9471C5: '1'
## Warning: Coercing text to numeric in E9472 / R9472C5: '1'
## Warning: Coercing text to numeric in E9473 / R9473C5: '1'
## Warning: Coercing text to numeric in E9474 / R9474C5: '1'
## Warning: Coercing text to numeric in E9475 / R9475C5: '1'
## Warning: Coercing text to numeric in E9476 / R9476C5: '2'
## Warning: Coercing text to numeric in E9477 / R9477C5: '2'
## Warning: Coercing text to numeric in E9478 / R9478C5: '2'
## Warning: Coercing text to numeric in E9479 / R9479C5: '2'
## Warning: Coercing text to numeric in E9480 / R9480C5: '2'
## Warning: Coercing text to numeric in E9481 / R9481C5: '2'
## Warning: Coercing text to numeric in E9482 / R9482C5: '2'
## Warning: Coercing text to numeric in E9483 / R9483C5: '2'
## Warning: Coercing text to numeric in E9484 / R9484C5: '2'
## Warning: Coercing text to numeric in E9485 / R9485C5: '2'
## Warning: Coercing text to numeric in E9486 / R9486C5: '2'
## Warning: Coercing text to numeric in E9487 / R9487C5: '2'
## Warning: Coercing text to numeric in E9488 / R9488C5: '2'
## Warning: Coercing text to numeric in E9489 / R9489C5: '2'
## Warning: Coercing text to numeric in E9490 / R9490C5: '2'
## Warning: Coercing text to numeric in E9491 / R9491C5: '2'
## Warning: Coercing text to numeric in E9492 / R9492C5: '2'
## Warning: Coercing text to numeric in E9493 / R9493C5: '2'
## Warning: Coercing text to numeric in E9494 / R9494C5: '2'
## Warning: Coercing text to numeric in E9495 / R9495C5: '2'
## Warning: Coercing text to numeric in E9496 / R9496C5: '2'
## Warning: Coercing text to numeric in E9497 / R9497C5: '2'
## Warning: Coercing text to numeric in E9498 / R9498C5: '2'
## Warning: Coercing text to numeric in E9499 / R9499C5: '2'
## Warning: Coercing text to numeric in E9500 / R9500C5: '1'
## Warning: Coercing text to numeric in E9501 / R9501C5: '1'
## Warning: Coercing text to numeric in E9502 / R9502C5: '1'
## Warning: Coercing text to numeric in E9503 / R9503C5: '1'
## Warning: Coercing text to numeric in E9504 / R9504C5: '1'
## Warning: Coercing text to numeric in E9505 / R9505C5: '1'
## Warning: Coercing text to numeric in E9506 / R9506C5: '1'
## Warning: Coercing text to numeric in E9507 / R9507C5: '1'
## Warning: Coercing text to numeric in E9508 / R9508C5: '1'
## Warning: Coercing text to numeric in E9509 / R9509C5: '1'
## Warning: Coercing text to numeric in E9510 / R9510C5: '1'
## Warning: Coercing text to numeric in E9511 / R9511C5: '1'
## Warning: Coercing text to numeric in E9512 / R9512C5: '1'
## Warning: Coercing text to numeric in E9513 / R9513C5: '1'
## Warning: Coercing text to numeric in E9514 / R9514C5: '1'
## Warning: Coercing text to numeric in E9515 / R9515C5: '1'
## Warning: Coercing text to numeric in E9516 / R9516C5: '1'
## Warning: Coercing text to numeric in E9517 / R9517C5: '1'
## Warning: Coercing text to numeric in E9518 / R9518C5: '1'
## Warning: Coercing text to numeric in E9519 / R9519C5: '1'
## Warning: Coercing text to numeric in E9520 / R9520C5: '1'
## Warning: Coercing text to numeric in E9521 / R9521C5: '1'
## Warning: Coercing text to numeric in E9522 / R9522C5: '1'
## Warning: Coercing text to numeric in E9523 / R9523C5: '1'
## Warning: Coercing text to numeric in E9524 / R9524C5: '1'
## Warning: Coercing text to numeric in E9525 / R9525C5: '1'
## Warning: Coercing text to numeric in E9526 / R9526C5: '1'
## Warning: Coercing text to numeric in E9527 / R9527C5: '1'
## Warning: Coercing text to numeric in E9528 / R9528C5: '1'
## Warning: Coercing text to numeric in E9529 / R9529C5: '1'
## Warning: Coercing text to numeric in E9530 / R9530C5: '2'
## Warning: Coercing text to numeric in E9531 / R9531C5: '2'
## Warning: Coercing text to numeric in E9532 / R9532C5: '2'
## Warning: Coercing text to numeric in E9533 / R9533C5: '2'
## Warning: Coercing text to numeric in E9534 / R9534C5: '2'
## Warning: Coercing text to numeric in E9535 / R9535C5: '2'
## Warning: Coercing text to numeric in E9536 / R9536C5: '2'
## Warning: Coercing text to numeric in E9537 / R9537C5: '2'
## Warning: Coercing text to numeric in E9538 / R9538C5: '2'
## Warning: Coercing text to numeric in E9539 / R9539C5: '2'
## Warning: Coercing text to numeric in E9540 / R9540C5: '2'
## Warning: Coercing text to numeric in E9541 / R9541C5: '2'
## Warning: Coercing text to numeric in E9542 / R9542C5: '2'
## Warning: Coercing text to numeric in E9543 / R9543C5: '2'
## Warning: Coercing text to numeric in E9544 / R9544C5: '2'
## Warning: Coercing text to numeric in E9545 / R9545C5: '2'
## Warning: Coercing text to numeric in E9546 / R9546C5: '2'
## Warning: Coercing text to numeric in E9547 / R9547C5: '2'
## Warning: Coercing text to numeric in E9548 / R9548C5: '2'
## Warning: Coercing text to numeric in E9549 / R9549C5: '2'
## Warning: Coercing text to numeric in E9550 / R9550C5: '2'
## Warning: Coercing text to numeric in E9551 / R9551C5: '2'
## Warning: Coercing text to numeric in E9552 / R9552C5: '2'
## Warning: Coercing text to numeric in E9553 / R9553C5: '2'
## Warning: Coercing text to numeric in E9554 / R9554C5: '1'
## Warning: Coercing text to numeric in E9555 / R9555C5: '1'
## Warning: Coercing text to numeric in E9556 / R9556C5: '1'
## Warning: Coercing text to numeric in E9557 / R9557C5: '1'
## Warning: Coercing text to numeric in E9558 / R9558C5: '1'
## Warning: Coercing text to numeric in E9559 / R9559C5: '1'
## Warning: Coercing text to numeric in E9560 / R9560C5: '2'
## Warning: Coercing text to numeric in E9561 / R9561C5: '2'
## Warning: Coercing text to numeric in E9562 / R9562C5: '2'
## Warning: Coercing text to numeric in E9563 / R9563C5: '2'
## Warning: Coercing text to numeric in E9564 / R9564C5: '2'
## Warning: Coercing text to numeric in E9565 / R9565C5: '2'
## Warning: Coercing text to numeric in E9566 / R9566C5: '1'
## Warning: Coercing text to numeric in E9567 / R9567C5: '1'
## Warning: Coercing text to numeric in E9568 / R9568C5: '1'
## Warning: Coercing text to numeric in E9569 / R9569C5: '1'
## Warning: Coercing text to numeric in E9570 / R9570C5: '1'
## Warning: Coercing text to numeric in E9571 / R9571C5: '1'
## Warning: Coercing text to numeric in E9572 / R9572C5: '1'
## Warning: Coercing text to numeric in E9573 / R9573C5: '1'
## Warning: Coercing text to numeric in E9574 / R9574C5: '1'
## Warning: Coercing text to numeric in E9575 / R9575C5: '1'
## Warning: Coercing text to numeric in E9576 / R9576C5: '1'
## Warning: Coercing text to numeric in E9577 / R9577C5: '1'
## Warning: Coercing text to numeric in E9578 / R9578C5: '1'
## Warning: Coercing text to numeric in E9579 / R9579C5: '1'
## Warning: Coercing text to numeric in E9580 / R9580C5: '1'
## Warning: Coercing text to numeric in E9581 / R9581C5: '1'
## Warning: Coercing text to numeric in E9582 / R9582C5: '1'
## Warning: Coercing text to numeric in E9583 / R9583C5: '1'
## Warning: Coercing text to numeric in E9584 / R9584C5: '2'
## Warning: Coercing text to numeric in E9585 / R9585C5: '2'
## Warning: Coercing text to numeric in E9586 / R9586C5: '2'
## Warning: Coercing text to numeric in E9587 / R9587C5: '2'
## Warning: Coercing text to numeric in E9588 / R9588C5: '2'
## Warning: Coercing text to numeric in E9589 / R9589C5: '2'
## Warning: Coercing text to numeric in E9590 / R9590C5: '2'
## Warning: Coercing text to numeric in E9591 / R9591C5: '2'
## Warning: Coercing text to numeric in E9592 / R9592C5: '2'
## Warning: Coercing text to numeric in E9593 / R9593C5: '2'
## Warning: Coercing text to numeric in E9594 / R9594C5: '2'
## Warning: Coercing text to numeric in E9595 / R9595C5: '2'
## Warning: Coercing text to numeric in E9596 / R9596C5: '2'
## Warning: Coercing text to numeric in E9597 / R9597C5: '2'
## Warning: Coercing text to numeric in E9598 / R9598C5: '2'
## Warning: Coercing text to numeric in E9599 / R9599C5: '2'
## Warning: Coercing text to numeric in E9600 / R9600C5: '2'
## Warning: Coercing text to numeric in E9601 / R9601C5: '2'
## Warning: Coercing text to numeric in E9602 / R9602C5: '2'
## Warning: Coercing text to numeric in E9603 / R9603C5: '2'
## Warning: Coercing text to numeric in E9604 / R9604C5: '2'
## Warning: Coercing text to numeric in E9605 / R9605C5: '2'
## Warning: Coercing text to numeric in E9606 / R9606C5: '2'
## Warning: Coercing text to numeric in E9607 / R9607C5: '2'
## Warning: Coercing text to numeric in E9608 / R9608C5: '2'
## Warning: Coercing text to numeric in E9609 / R9609C5: '2'
## Warning: Coercing text to numeric in E9610 / R9610C5: '2'
## Warning: Coercing text to numeric in E9611 / R9611C5: '2'
## Warning: Coercing text to numeric in E9612 / R9612C5: '2'
## Warning: Coercing text to numeric in E9613 / R9613C5: '2'
## Warning: Coercing text to numeric in E9614 / R9614C5: '1'
## Warning: Coercing text to numeric in E9615 / R9615C5: '1'
## Warning: Coercing text to numeric in E9616 / R9616C5: '1'
## Warning: Coercing text to numeric in E9617 / R9617C5: '1'
## Warning: Coercing text to numeric in E9618 / R9618C5: '1'
## Warning: Coercing text to numeric in E9619 / R9619C5: '1'
## Warning: Coercing text to numeric in E9620 / R9620C5: '2'
## Warning: Coercing text to numeric in E9621 / R9621C5: '2'
## Warning: Coercing text to numeric in E9622 / R9622C5: '2'
## Warning: Coercing text to numeric in E9623 / R9623C5: '2'
## Warning: Coercing text to numeric in E9624 / R9624C5: '2'
## Warning: Coercing text to numeric in E9625 / R9625C5: '2'
## Warning: Coercing text to numeric in E9626 / R9626C5: '1'
## Warning: Coercing text to numeric in E9627 / R9627C5: '1'
## Warning: Coercing text to numeric in E9628 / R9628C5: '1'
## Warning: Coercing text to numeric in E9629 / R9629C5: '1'
## Warning: Coercing text to numeric in E9630 / R9630C5: '1'
## Warning: Coercing text to numeric in E9631 / R9631C5: '1'
## Warning: Coercing text to numeric in E9632 / R9632C5: '1'
## Warning: Coercing text to numeric in E9633 / R9633C5: '1'
## Warning: Coercing text to numeric in E9634 / R9634C5: '1'
## Warning: Coercing text to numeric in E9635 / R9635C5: '1'
## Warning: Coercing text to numeric in E9636 / R9636C5: '1'
## Warning: Coercing text to numeric in E9637 / R9637C5: '1'
## Warning: Coercing text to numeric in E9638 / R9638C5: '1'
## Warning: Coercing text to numeric in E9639 / R9639C5: '1'
## Warning: Coercing text to numeric in E9640 / R9640C5: '1'
## Warning: Coercing text to numeric in E9641 / R9641C5: '1'
## Warning: Coercing text to numeric in E9642 / R9642C5: '1'
## Warning: Coercing text to numeric in E9643 / R9643C5: '1'
## Warning: Coercing text to numeric in E9644 / R9644C5: '1'
## Warning: Coercing text to numeric in E9645 / R9645C5: '1'
## Warning: Coercing text to numeric in E9646 / R9646C5: '1'
## Warning: Coercing text to numeric in E9647 / R9647C5: '1'
## Warning: Coercing text to numeric in E9648 / R9648C5: '1'
## Warning: Coercing text to numeric in E9649 / R9649C5: '1'
## Warning: Coercing text to numeric in E9650 / R9650C5: '1'
## Warning: Coercing text to numeric in E9651 / R9651C5: '1'
## Warning: Coercing text to numeric in E9652 / R9652C5: '1'
## Warning: Coercing text to numeric in E9653 / R9653C5: '1'
## Warning: Coercing text to numeric in E9654 / R9654C5: '1'
## Warning: Coercing text to numeric in E9655 / R9655C5: '1'
## Warning: Coercing text to numeric in E9656 / R9656C5: '1'
## Warning: Coercing text to numeric in E9657 / R9657C5: '1'
## Warning: Coercing text to numeric in E9658 / R9658C5: '1'
## Warning: Coercing text to numeric in E9659 / R9659C5: '1'
## Warning: Coercing text to numeric in E9660 / R9660C5: '1'
## Warning: Coercing text to numeric in E9661 / R9661C5: '1'
## Warning: Coercing text to numeric in E9662 / R9662C5: '1'
## Warning: Coercing text to numeric in E9663 / R9663C5: '1'
## Warning: Coercing text to numeric in E9664 / R9664C5: '1'
## Warning: Coercing text to numeric in E9665 / R9665C5: '1'
## Warning: Coercing text to numeric in E9666 / R9666C5: '1'
## Warning: Coercing text to numeric in E9667 / R9667C5: '1'
## Warning: Coercing text to numeric in E9668 / R9668C5: '2'
## Warning: Coercing text to numeric in E9669 / R9669C5: '2'
## Warning: Coercing text to numeric in E9670 / R9670C5: '2'
## Warning: Coercing text to numeric in E9671 / R9671C5: '2'
## Warning: Coercing text to numeric in E9672 / R9672C5: '2'
## Warning: Coercing text to numeric in E9673 / R9673C5: '2'
## Warning: Coercing text to numeric in E9674 / R9674C5: '1'
## Warning: Coercing text to numeric in E9675 / R9675C5: '1'
## Warning: Coercing text to numeric in E9676 / R9676C5: '1'
## Warning: Coercing text to numeric in E9677 / R9677C5: '1'
## Warning: Coercing text to numeric in E9678 / R9678C5: '1'
## Warning: Coercing text to numeric in E9679 / R9679C5: '1'
## Warning: Coercing text to numeric in E9680 / R9680C5: '2'
## Warning: Coercing text to numeric in E9681 / R9681C5: '2'
## Warning: Coercing text to numeric in E9682 / R9682C5: '2'
## Warning: Coercing text to numeric in E9683 / R9683C5: '2'
## Warning: Coercing text to numeric in E9684 / R9684C5: '2'
## Warning: Coercing text to numeric in E9685 / R9685C5: '2'
## Warning: Coercing text to numeric in E9686 / R9686C5: '1'
## Warning: Coercing text to numeric in E9687 / R9687C5: '1'
## Warning: Coercing text to numeric in E9688 / R9688C5: '1'
## Warning: Coercing text to numeric in E9689 / R9689C5: '1'
## Warning: Coercing text to numeric in E9690 / R9690C5: '1'
## Warning: Coercing text to numeric in E9691 / R9691C5: '1'
## Warning: Coercing text to numeric in E9692 / R9692C5: '1'
## Warning: Coercing text to numeric in E9693 / R9693C5: '1'
## Warning: Coercing text to numeric in E9694 / R9694C5: '1'
## Warning: Coercing text to numeric in E9695 / R9695C5: '1'
## Warning: Coercing text to numeric in E9696 / R9696C5: '1'
## Warning: Coercing text to numeric in E9697 / R9697C5: '1'
## Warning: Coercing text to numeric in E9698 / R9698C5: '1'
## Warning: Coercing text to numeric in E9699 / R9699C5: '1'
## Warning: Coercing text to numeric in E9700 / R9700C5: '1'
## Warning: Coercing text to numeric in E9701 / R9701C5: '1'
## Warning: Coercing text to numeric in E9702 / R9702C5: '1'
## Warning: Coercing text to numeric in E9703 / R9703C5: '1'
## Warning: Coercing text to numeric in E9704 / R9704C5: '1'
## Warning: Coercing text to numeric in E9705 / R9705C5: '1'
## Warning: Coercing text to numeric in E9706 / R9706C5: '1'
## Warning: Coercing text to numeric in E9707 / R9707C5: '1'
## Warning: Coercing text to numeric in E9708 / R9708C5: '1'
## Warning: Coercing text to numeric in E9709 / R9709C5: '1'
## Warning: Coercing text to numeric in E9710 / R9710C5: '2'
## Warning: Coercing text to numeric in E9711 / R9711C5: '2'
## Warning: Coercing text to numeric in E9712 / R9712C5: '2'
## Warning: Coercing text to numeric in E9713 / R9713C5: '2'
## Warning: Coercing text to numeric in E9714 / R9714C5: '2'
## Warning: Coercing text to numeric in E9715 / R9715C5: '2'
## Warning: Coercing text to numeric in E9716 / R9716C5: '1'
## Warning: Coercing text to numeric in E9717 / R9717C5: '1'
## Warning: Coercing text to numeric in E9718 / R9718C5: '1'
## Warning: Coercing text to numeric in E9719 / R9719C5: '1'
## Warning: Coercing text to numeric in E9720 / R9720C5: '1'
## Warning: Coercing text to numeric in E9721 / R9721C5: '1'
## Warning: Coercing text to numeric in E9722 / R9722C5: '1'
## Warning: Coercing text to numeric in E9723 / R9723C5: '1'
## Warning: Coercing text to numeric in E9724 / R9724C5: '1'
## Warning: Coercing text to numeric in E9725 / R9725C5: '1'
## Warning: Coercing text to numeric in E9726 / R9726C5: '1'
## Warning: Coercing text to numeric in E9727 / R9727C5: '1'
## Warning: Coercing text to numeric in E9728 / R9728C5: '2'
## Warning: Coercing text to numeric in E9729 / R9729C5: '2'
## Warning: Coercing text to numeric in E9730 / R9730C5: '2'
## Warning: Coercing text to numeric in E9731 / R9731C5: '2'
## Warning: Coercing text to numeric in E9732 / R9732C5: '2'
## Warning: Coercing text to numeric in E9733 / R9733C5: '2'
## Warning: Coercing text to numeric in E9734 / R9734C5: '2'
## Warning: Coercing text to numeric in E9735 / R9735C5: '2'
## Warning: Coercing text to numeric in E9736 / R9736C5: '2'
## Warning: Coercing text to numeric in E9737 / R9737C5: '2'
## Warning: Coercing text to numeric in E9738 / R9738C5: '2'
## Warning: Coercing text to numeric in E9739 / R9739C5: '2'
## Warning: Coercing text to numeric in E9740 / R9740C5: '2'
## Warning: Coercing text to numeric in E9741 / R9741C5: '2'
## Warning: Coercing text to numeric in E9742 / R9742C5: '2'
## Warning: Coercing text to numeric in E9743 / R9743C5: '2'
## Warning: Coercing text to numeric in E9744 / R9744C5: '2'
## Warning: Coercing text to numeric in E9745 / R9745C5: '2'
## Warning: Coercing text to numeric in E9746 / R9746C5: '2'
## Warning: Coercing text to numeric in E9747 / R9747C5: '2'
## Warning: Coercing text to numeric in E9748 / R9748C5: '2'
## Warning: Coercing text to numeric in E9749 / R9749C5: '2'
## Warning: Coercing text to numeric in E9750 / R9750C5: '2'
## Warning: Coercing text to numeric in E9751 / R9751C5: '2'
## Warning: Coercing text to numeric in E9752 / R9752C5: '2'
## Warning: Coercing text to numeric in E9753 / R9753C5: '2'
## Warning: Coercing text to numeric in E9754 / R9754C5: '2'
## Warning: Coercing text to numeric in E9755 / R9755C5: '2'
## Warning: Coercing text to numeric in E9756 / R9756C5: '2'
## Warning: Coercing text to numeric in E9757 / R9757C5: '2'
## Warning: Coercing text to numeric in E9758 / R9758C5: '2'
## Warning: Coercing text to numeric in E9759 / R9759C5: '2'
## Warning: Coercing text to numeric in E9760 / R9760C5: '2'
## Warning: Coercing text to numeric in E9761 / R9761C5: '2'
## Warning: Coercing text to numeric in E9762 / R9762C5: '2'
## Warning: Coercing text to numeric in E9763 / R9763C5: '2'
## Warning: Coercing text to numeric in E9764 / R9764C5: '2'
## Warning: Coercing text to numeric in E9765 / R9765C5: '2'
## Warning: Coercing text to numeric in E9766 / R9766C5: '2'
## Warning: Coercing text to numeric in E9767 / R9767C5: '2'
## Warning: Coercing text to numeric in E9768 / R9768C5: '2'
## Warning: Coercing text to numeric in E9769 / R9769C5: '2'
## Warning: Coercing text to numeric in E9770 / R9770C5: '2'
## Warning: Coercing text to numeric in E9771 / R9771C5: '2'
## Warning: Coercing text to numeric in E9772 / R9772C5: '2'
## Warning: Coercing text to numeric in E9773 / R9773C5: '2'
## Warning: Coercing text to numeric in E9774 / R9774C5: '2'
## Warning: Coercing text to numeric in E9775 / R9775C5: '2'
## Warning: Coercing text to numeric in E9776 / R9776C5: '2'
## Warning: Coercing text to numeric in E9777 / R9777C5: '2'
## Warning: Coercing text to numeric in E9778 / R9778C5: '2'
## Warning: Coercing text to numeric in E9779 / R9779C5: '2'
## Warning: Coercing text to numeric in E9780 / R9780C5: '2'
## Warning: Coercing text to numeric in E9781 / R9781C5: '2'
## Warning: Coercing text to numeric in E9782 / R9782C5: '1'
## Warning: Coercing text to numeric in E9783 / R9783C5: '1'
## Warning: Coercing text to numeric in E9784 / R9784C5: '1'
## Warning: Coercing text to numeric in E9785 / R9785C5: '1'
## Warning: Coercing text to numeric in E9786 / R9786C5: '1'
## Warning: Coercing text to numeric in E9787 / R9787C5: '1'
## Warning: Coercing text to numeric in E9788 / R9788C5: '2'
## Warning: Coercing text to numeric in E9789 / R9789C5: '2'
## Warning: Coercing text to numeric in E9790 / R9790C5: '2'
## Warning: Coercing text to numeric in E9791 / R9791C5: '2'
## Warning: Coercing text to numeric in E9792 / R9792C5: '2'
## Warning: Coercing text to numeric in E9793 / R9793C5: '2'
## Warning: Coercing text to numeric in E9794 / R9794C5: '1'
## Warning: Coercing text to numeric in E9795 / R9795C5: '1'
## Warning: Coercing text to numeric in E9796 / R9796C5: '1'
## Warning: Coercing text to numeric in E9797 / R9797C5: '1'
## Warning: Coercing text to numeric in E9798 / R9798C5: '1'
## Warning: Coercing text to numeric in E9799 / R9799C5: '1'
## Warning: Coercing text to numeric in E9800 / R9800C5: '2'
## Warning: Coercing text to numeric in E9801 / R9801C5: '2'
## Warning: Coercing text to numeric in E9802 / R9802C5: '2'
## Warning: Coercing text to numeric in E9803 / R9803C5: '2'
## Warning: Coercing text to numeric in E9804 / R9804C5: '2'
## Warning: Coercing text to numeric in E9805 / R9805C5: '2'
## Warning: Coercing text to numeric in E9806 / R9806C5: '2'
## Warning: Coercing text to numeric in E9807 / R9807C5: '2'
## Warning: Coercing text to numeric in E9808 / R9808C5: '2'
## Warning: Coercing text to numeric in E9809 / R9809C5: '2'
## Warning: Coercing text to numeric in E9810 / R9810C5: '2'
## Warning: Coercing text to numeric in E9811 / R9811C5: '2'
## Warning: Coercing text to numeric in E9812 / R9812C5: '2'
## Warning: Coercing text to numeric in E9813 / R9813C5: '2'
## Warning: Coercing text to numeric in E9814 / R9814C5: '2'
## Warning: Coercing text to numeric in E9815 / R9815C5: '2'
## Warning: Coercing text to numeric in E9816 / R9816C5: '2'
## Warning: Coercing text to numeric in E9817 / R9817C5: '2'
## Warning: Coercing text to numeric in E9818 / R9818C5: '1'
## Warning: Coercing text to numeric in E9819 / R9819C5: '1'
## Warning: Coercing text to numeric in E9820 / R9820C5: '1'
## Warning: Coercing text to numeric in E9821 / R9821C5: '1'
## Warning: Coercing text to numeric in E9822 / R9822C5: '1'
## Warning: Coercing text to numeric in E9823 / R9823C5: '1'
## Warning: Coercing text to numeric in E9824 / R9824C5: '2'
## Warning: Coercing text to numeric in E9825 / R9825C5: '2'
## Warning: Coercing text to numeric in E9826 / R9826C5: '2'
## Warning: Coercing text to numeric in E9827 / R9827C5: '2'
## Warning: Coercing text to numeric in E9828 / R9828C5: '2'
## Warning: Coercing text to numeric in E9829 / R9829C5: '2'
## Warning: Coercing text to numeric in E9830 / R9830C5: '2'
## Warning: Coercing text to numeric in E9831 / R9831C5: '2'
## Warning: Coercing text to numeric in E9832 / R9832C5: '2'
## Warning: Coercing text to numeric in E9833 / R9833C5: '2'
## Warning: Coercing text to numeric in E9834 / R9834C5: '2'
## Warning: Coercing text to numeric in E9835 / R9835C5: '2'
## Warning: Coercing text to numeric in E9836 / R9836C5: '2'
## Warning: Coercing text to numeric in E9837 / R9837C5: '2'
## Warning: Coercing text to numeric in E9838 / R9838C5: '2'
## Warning: Coercing text to numeric in E9839 / R9839C5: '2'
## Warning: Coercing text to numeric in E9840 / R9840C5: '2'
## Warning: Coercing text to numeric in E9841 / R9841C5: '2'
## Warning: Coercing text to numeric in E9842 / R9842C5: '2'
## Warning: Coercing text to numeric in E9843 / R9843C5: '2'
## Warning: Coercing text to numeric in E9844 / R9844C5: '2'
## Warning: Coercing text to numeric in E9845 / R9845C5: '2'
## Warning: Coercing text to numeric in E9846 / R9846C5: '2'
## Warning: Coercing text to numeric in E9847 / R9847C5: '2'
## Warning: Coercing text to numeric in E9848 / R9848C5: '1'
## Warning: Coercing text to numeric in E9849 / R9849C5: '1'
## Warning: Coercing text to numeric in E9850 / R9850C5: '1'
## Warning: Coercing text to numeric in E9851 / R9851C5: '1'
## Warning: Coercing text to numeric in E9852 / R9852C5: '1'
## Warning: Coercing text to numeric in E9853 / R9853C5: '1'
## Warning: Coercing text to numeric in E9854 / R9854C5: '2'
## Warning: Coercing text to numeric in E9855 / R9855C5: '2'
## Warning: Coercing text to numeric in E9856 / R9856C5: '2'
## Warning: Coercing text to numeric in E9857 / R9857C5: '2'
## Warning: Coercing text to numeric in E9858 / R9858C5: '2'
## Warning: Coercing text to numeric in E9859 / R9859C5: '2'
## Warning: Coercing text to numeric in E9860 / R9860C5: '1'
## Warning: Coercing text to numeric in E9861 / R9861C5: '1'
## Warning: Coercing text to numeric in E9862 / R9862C5: '1'
## Warning: Coercing text to numeric in E9863 / R9863C5: '1'
## Warning: Coercing text to numeric in E9864 / R9864C5: '1'
## Warning: Coercing text to numeric in E9865 / R9865C5: '1'
## Warning: Coercing text to numeric in E9866 / R9866C5: '1'
## Warning: Coercing text to numeric in E9867 / R9867C5: '1'
## Warning: Coercing text to numeric in E9868 / R9868C5: '1'
## Warning: Coercing text to numeric in E9869 / R9869C5: '1'
## Warning: Coercing text to numeric in E9870 / R9870C5: '1'
## Warning: Coercing text to numeric in E9871 / R9871C5: '1'
## Warning: Coercing text to numeric in E9872 / R9872C5: '1'
## Warning: Coercing text to numeric in E9873 / R9873C5: '1'
## Warning: Coercing text to numeric in E9874 / R9874C5: '1'
## Warning: Coercing text to numeric in E9875 / R9875C5: '1'
## Warning: Coercing text to numeric in E9876 / R9876C5: '1'
## Warning: Coercing text to numeric in E9877 / R9877C5: '1'
## Warning: Coercing text to numeric in E9878 / R9878C5: '2'
## Warning: Coercing text to numeric in E9879 / R9879C5: '2'
## Warning: Coercing text to numeric in E9880 / R9880C5: '2'
## Warning: Coercing text to numeric in E9881 / R9881C5: '2'
## Warning: Coercing text to numeric in E9882 / R9882C5: '2'
## Warning: Coercing text to numeric in E9883 / R9883C5: '2'
## Warning: Coercing text to numeric in E9884 / R9884C5: '1'
## Warning: Coercing text to numeric in E9885 / R9885C5: '1'
## Warning: Coercing text to numeric in E9886 / R9886C5: '1'
## Warning: Coercing text to numeric in E9887 / R9887C5: '1'
## Warning: Coercing text to numeric in E9888 / R9888C5: '1'
## Warning: Coercing text to numeric in E9889 / R9889C5: '1'
## Warning: Coercing text to numeric in E9890 / R9890C5: '1'
## Warning: Coercing text to numeric in E9891 / R9891C5: '1'
## Warning: Coercing text to numeric in E9892 / R9892C5: '1'
## Warning: Coercing text to numeric in E9893 / R9893C5: '1'
## Warning: Coercing text to numeric in E9894 / R9894C5: '1'
## Warning: Coercing text to numeric in E9895 / R9895C5: '1'
## Warning: Coercing text to numeric in E9896 / R9896C5: '2'
## Warning: Coercing text to numeric in E9897 / R9897C5: '2'
## Warning: Coercing text to numeric in E9898 / R9898C5: '2'
## Warning: Coercing text to numeric in E9899 / R9899C5: '2'
## Warning: Coercing text to numeric in E9900 / R9900C5: '2'
## Warning: Coercing text to numeric in E9901 / R9901C5: '2'
## Warning: Coercing text to numeric in E9902 / R9902C5: '2'
## Warning: Coercing text to numeric in E9903 / R9903C5: '2'
## Warning: Coercing text to numeric in E9904 / R9904C5: '2'
## Warning: Coercing text to numeric in E9905 / R9905C5: '2'
## Warning: Coercing text to numeric in E9906 / R9906C5: '2'
## Warning: Coercing text to numeric in E9907 / R9907C5: '2'
## Warning: Coercing text to numeric in E9908 / R9908C5: '2'
## Warning: Coercing text to numeric in E9909 / R9909C5: '2'
## Warning: Coercing text to numeric in E9910 / R9910C5: '2'
## Warning: Coercing text to numeric in E9911 / R9911C5: '2'
## Warning: Coercing text to numeric in E9912 / R9912C5: '2'
## Warning: Coercing text to numeric in E9913 / R9913C5: '2'
## Warning: Coercing text to numeric in E9914 / R9914C5: '1'
## Warning: Coercing text to numeric in E9915 / R9915C5: '1'
## Warning: Coercing text to numeric in E9916 / R9916C5: '1'
## Warning: Coercing text to numeric in E9917 / R9917C5: '1'
## Warning: Coercing text to numeric in E9918 / R9918C5: '1'
## Warning: Coercing text to numeric in E9919 / R9919C5: '1'
## Warning: Coercing text to numeric in E9920 / R9920C5: '1'
## Warning: Coercing text to numeric in E9921 / R9921C5: '1'
## Warning: Coercing text to numeric in E9922 / R9922C5: '1'
## Warning: Coercing text to numeric in E9923 / R9923C5: '1'
## Warning: Coercing text to numeric in E9924 / R9924C5: '1'
## Warning: Coercing text to numeric in E9925 / R9925C5: '1'
## Warning: Coercing text to numeric in E9926 / R9926C5: '1'
## Warning: Coercing text to numeric in E9927 / R9927C5: '1'
## Warning: Coercing text to numeric in E9928 / R9928C5: '1'
## Warning: Coercing text to numeric in E9929 / R9929C5: '1'
## Warning: Coercing text to numeric in E9930 / R9930C5: '1'
## Warning: Coercing text to numeric in E9931 / R9931C5: '1'
## Warning: Coercing text to numeric in E9932 / R9932C5: '1'
## Warning: Coercing text to numeric in E9933 / R9933C5: '1'
## Warning: Coercing text to numeric in E9934 / R9934C5: '1'
## Warning: Coercing text to numeric in E9935 / R9935C5: '1'
## Warning: Coercing text to numeric in E9936 / R9936C5: '1'
## Warning: Coercing text to numeric in E9937 / R9937C5: '1'
## Warning: Coercing text to numeric in E9938 / R9938C5: '1'
## Warning: Coercing text to numeric in E9939 / R9939C5: '1'
## Warning: Coercing text to numeric in E9940 / R9940C5: '1'
## Warning: Coercing text to numeric in E9941 / R9941C5: '1'
## Warning: Coercing text to numeric in E9942 / R9942C5: '1'
## Warning: Coercing text to numeric in E9943 / R9943C5: '1'
## Warning: Coercing text to numeric in E9944 / R9944C5: '1'
## Warning: Coercing text to numeric in E9945 / R9945C5: '1'
## Warning: Coercing text to numeric in E9946 / R9946C5: '1'
## Warning: Coercing text to numeric in E9947 / R9947C5: '1'
## Warning: Coercing text to numeric in E9948 / R9948C5: '1'
## Warning: Coercing text to numeric in E9949 / R9949C5: '1'
## Warning: Coercing text to numeric in E9950 / R9950C5: '1'
## Warning: Coercing text to numeric in E9951 / R9951C5: '1'
## Warning: Coercing text to numeric in E9952 / R9952C5: '1'
## Warning: Coercing text to numeric in E9953 / R9953C5: '1'
## Warning: Coercing text to numeric in E9954 / R9954C5: '1'
## Warning: Coercing text to numeric in E9955 / R9955C5: '1'
## Warning: Coercing text to numeric in E9956 / R9956C5: '2'
## Warning: Coercing text to numeric in E9957 / R9957C5: '2'
## Warning: Coercing text to numeric in E9958 / R9958C5: '2'
## Warning: Coercing text to numeric in E9959 / R9959C5: '2'
## Warning: Coercing text to numeric in E9960 / R9960C5: '2'
## Warning: Coercing text to numeric in E9961 / R9961C5: '2'
## Warning: Coercing text to numeric in E9962 / R9962C5: '1'
## Warning: Coercing text to numeric in E9963 / R9963C5: '1'
## Warning: Coercing text to numeric in E9964 / R9964C5: '1'
## Warning: Coercing text to numeric in E9965 / R9965C5: '1'
## Warning: Coercing text to numeric in E9966 / R9966C5: '1'
## Warning: Coercing text to numeric in E9967 / R9967C5: '1'
## Warning: Coercing text to numeric in E9968 / R9968C5: '1'
## Warning: Coercing text to numeric in E9969 / R9969C5: '1'
## Warning: Coercing text to numeric in E9970 / R9970C5: '1'
## Warning: Coercing text to numeric in E9971 / R9971C5: '1'
## Warning: Coercing text to numeric in E9972 / R9972C5: '1'
## Warning: Coercing text to numeric in E9973 / R9973C5: '1'
## Warning: Coercing text to numeric in E9974 / R9974C5: '1'
## Warning: Coercing text to numeric in E9975 / R9975C5: '1'
## Warning: Coercing text to numeric in E9976 / R9976C5: '1'
## Warning: Coercing text to numeric in E9977 / R9977C5: '1'
## Warning: Coercing text to numeric in E9978 / R9978C5: '1'
## Warning: Coercing text to numeric in E9979 / R9979C5: '1'
## Warning: Coercing text to numeric in E9980 / R9980C5: '2'
## Warning: Coercing text to numeric in E9981 / R9981C5: '2'
## Warning: Coercing text to numeric in E9982 / R9982C5: '2'
## Warning: Coercing text to numeric in E9983 / R9983C5: '2'
## Warning: Coercing text to numeric in E9984 / R9984C5: '2'
## Warning: Coercing text to numeric in E9985 / R9985C5: '2'
## Warning: Coercing text to numeric in E9986 / R9986C5: '1'
## Warning: Coercing text to numeric in E9987 / R9987C5: '1'
## Warning: Coercing text to numeric in E9988 / R9988C5: '1'
## Warning: Coercing text to numeric in E9989 / R9989C5: '1'
## Warning: Coercing text to numeric in E9990 / R9990C5: '1'
## Warning: Coercing text to numeric in E9991 / R9991C5: '1'
## Warning: Coercing text to numeric in E9992 / R9992C5: '2'
## Warning: Coercing text to numeric in E9993 / R9993C5: '2'
## Warning: Coercing text to numeric in E9994 / R9994C5: '2'
## Warning: Coercing text to numeric in E9995 / R9995C5: '2'
## Warning: Coercing text to numeric in E9996 / R9996C5: '2'
## Warning: Coercing text to numeric in E9997 / R9997C5: '2'
## Warning: Coercing text to numeric in E9998 / R9998C5: '2'
## Warning: Coercing text to numeric in E9999 / R9999C5: '2'
## Warning: Coercing text to numeric in E10000 / R10000C5: '2'
## Warning: Coercing text to numeric in E10001 / R10001C5: '2'
## Warning: Coercing text to numeric in E10002 / R10002C5: '2'
## Warning: Coercing text to numeric in E10003 / R10003C5: '2'
## Warning: Coercing text to numeric in E10004 / R10004C5: '1'
## Warning: Coercing text to numeric in E10005 / R10005C5: '1'
## Warning: Coercing text to numeric in E10006 / R10006C5: '1'
## Warning: Coercing text to numeric in E10007 / R10007C5: '1'
## Warning: Coercing text to numeric in E10008 / R10008C5: '1'
## Warning: Coercing text to numeric in E10009 / R10009C5: '1'
## Warning: Coercing text to numeric in E10010 / R10010C5: '2'
## Warning: Coercing text to numeric in E10011 / R10011C5: '2'
## Warning: Coercing text to numeric in E10012 / R10012C5: '2'
## Warning: Coercing text to numeric in E10013 / R10013C5: '2'
## Warning: Coercing text to numeric in E10014 / R10014C5: '2'
## Warning: Coercing text to numeric in E10015 / R10015C5: '2'
## Warning: Coercing text to numeric in E10016 / R10016C5: '1'
## Warning: Coercing text to numeric in E10017 / R10017C5: '1'
## Warning: Coercing text to numeric in E10018 / R10018C5: '1'
## Warning: Coercing text to numeric in E10019 / R10019C5: '1'
## Warning: Coercing text to numeric in E10020 / R10020C5: '1'
## Warning: Coercing text to numeric in E10021 / R10021C5: '1'
## Warning: Coercing text to numeric in E10022 / R10022C5: '1'
## Warning: Coercing text to numeric in E10023 / R10023C5: '1'
## Warning: Coercing text to numeric in E10024 / R10024C5: '1'
## Warning: Coercing text to numeric in E10025 / R10025C5: '1'
## Warning: Coercing text to numeric in E10026 / R10026C5: '1'
## Warning: Coercing text to numeric in E10027 / R10027C5: '1'
## Warning: Coercing text to numeric in E10028 / R10028C5: '1'
## Warning: Coercing text to numeric in E10029 / R10029C5: '1'
## Warning: Coercing text to numeric in E10030 / R10030C5: '1'
## Warning: Coercing text to numeric in E10031 / R10031C5: '1'
## Warning: Coercing text to numeric in E10032 / R10032C5: '1'
## Warning: Coercing text to numeric in E10033 / R10033C5: '1'
## Warning: Coercing text to numeric in E10034 / R10034C5: '2'
## Warning: Coercing text to numeric in E10035 / R10035C5: '2'
## Warning: Coercing text to numeric in E10036 / R10036C5: '2'
## Warning: Coercing text to numeric in E10037 / R10037C5: '2'
## Warning: Coercing text to numeric in E10038 / R10038C5: '2'
## Warning: Coercing text to numeric in E10039 / R10039C5: '2'
## Warning: Coercing text to numeric in E10040 / R10040C5: '2'
## Warning: Coercing text to numeric in E10041 / R10041C5: '2'
## Warning: Coercing text to numeric in E10042 / R10042C5: '2'
## Warning: Coercing text to numeric in E10043 / R10043C5: '2'
## Warning: Coercing text to numeric in E10044 / R10044C5: '2'
## Warning: Coercing text to numeric in E10045 / R10045C5: '2'
## Warning: Coercing text to numeric in E10046 / R10046C5: '2'
## Warning: Coercing text to numeric in E10047 / R10047C5: '2'
## Warning: Coercing text to numeric in E10048 / R10048C5: '2'
## Warning: Coercing text to numeric in E10049 / R10049C5: '2'
## Warning: Coercing text to numeric in E10050 / R10050C5: '2'
## Warning: Coercing text to numeric in E10051 / R10051C5: '2'
## Warning: Coercing text to numeric in E10052 / R10052C5: '2'
## Warning: Coercing text to numeric in E10053 / R10053C5: '2'
## Warning: Coercing text to numeric in E10054 / R10054C5: '2'
## Warning: Coercing text to numeric in E10055 / R10055C5: '2'
## Warning: Coercing text to numeric in E10056 / R10056C5: '2'
## Warning: Coercing text to numeric in E10057 / R10057C5: '2'
## Warning: Coercing text to numeric in E10058 / R10058C5: '2'
## Warning: Coercing text to numeric in E10059 / R10059C5: '2'
## Warning: Coercing text to numeric in E10060 / R10060C5: '2'
## Warning: Coercing text to numeric in E10061 / R10061C5: '2'
## Warning: Coercing text to numeric in E10062 / R10062C5: '2'
## Warning: Coercing text to numeric in E10063 / R10063C5: '2'
## Warning: Coercing text to numeric in E10064 / R10064C5: '1'
## Warning: Coercing text to numeric in E10065 / R10065C5: '1'
## Warning: Coercing text to numeric in E10066 / R10066C5: '1'
## Warning: Coercing text to numeric in E10067 / R10067C5: '1'
## Warning: Coercing text to numeric in E10068 / R10068C5: '1'
## Warning: Coercing text to numeric in E10069 / R10069C5: '1'
## Warning: Coercing text to numeric in E10070 / R10070C5: '1'
## Warning: Coercing text to numeric in E10071 / R10071C5: '1'
## Warning: Coercing text to numeric in E10072 / R10072C5: '1'
## Warning: Coercing text to numeric in E10073 / R10073C5: '1'
## Warning: Coercing text to numeric in E10074 / R10074C5: '1'
## Warning: Coercing text to numeric in E10075 / R10075C5: '1'
## Warning: Coercing text to numeric in E10076 / R10076C5: '1'
## Warning: Coercing text to numeric in E10077 / R10077C5: '1'
## Warning: Coercing text to numeric in E10078 / R10078C5: '1'
## Warning: Coercing text to numeric in E10079 / R10079C5: '1'
## Warning: Coercing text to numeric in E10080 / R10080C5: '1'
## Warning: Coercing text to numeric in E10081 / R10081C5: '1'
## Warning: Coercing text to numeric in E10082 / R10082C5: '1'
## Warning: Coercing text to numeric in E10083 / R10083C5: '1'
## Warning: Coercing text to numeric in E10084 / R10084C5: '1'
## Warning: Coercing text to numeric in E10085 / R10085C5: '1'
## Warning: Coercing text to numeric in E10086 / R10086C5: '1'
## Warning: Coercing text to numeric in E10087 / R10087C5: '1'
## Warning: Coercing text to numeric in E10088 / R10088C5: '1'
## Warning: Coercing text to numeric in E10089 / R10089C5: '1'
## Warning: Coercing text to numeric in E10090 / R10090C5: '1'
## Warning: Coercing text to numeric in E10091 / R10091C5: '1'
## Warning: Coercing text to numeric in E10092 / R10092C5: '1'
## Warning: Coercing text to numeric in E10093 / R10093C5: '1'
## Warning: Coercing text to numeric in E10094 / R10094C5: '1'
## Warning: Coercing text to numeric in E10095 / R10095C5: '1'
## Warning: Coercing text to numeric in E10096 / R10096C5: '1'
## Warning: Coercing text to numeric in E10097 / R10097C5: '1'
## Warning: Coercing text to numeric in E10098 / R10098C5: '1'
## Warning: Coercing text to numeric in E10099 / R10099C5: '1'
## Warning: Coercing text to numeric in E10100 / R10100C5: '2'
## Warning: Coercing text to numeric in E10101 / R10101C5: '2'
## Warning: Coercing text to numeric in E10102 / R10102C5: '2'
## Warning: Coercing text to numeric in E10103 / R10103C5: '2'
## Warning: Coercing text to numeric in E10104 / R10104C5: '2'
## Warning: Coercing text to numeric in E10105 / R10105C5: '2'
## Warning: Coercing text to numeric in E10106 / R10106C5: '2'
## Warning: Coercing text to numeric in E10107 / R10107C5: '2'
## Warning: Coercing text to numeric in E10108 / R10108C5: '2'
## Warning: Coercing text to numeric in E10109 / R10109C5: '2'
## Warning: Coercing text to numeric in E10110 / R10110C5: '2'
## Warning: Coercing text to numeric in E10111 / R10111C5: '2'
## Warning: Coercing text to numeric in E10112 / R10112C5: '2'
## Warning: Coercing text to numeric in E10113 / R10113C5: '2'
## Warning: Coercing text to numeric in E10114 / R10114C5: '2'
## Warning: Coercing text to numeric in E10115 / R10115C5: '2'
## Warning: Coercing text to numeric in E10116 / R10116C5: '2'
## Warning: Coercing text to numeric in E10117 / R10117C5: '2'
## Warning: Coercing text to numeric in E10118 / R10118C5: '1'
## Warning: Coercing text to numeric in E10119 / R10119C5: '1'
## Warning: Coercing text to numeric in E10120 / R10120C5: '1'
## Warning: Coercing text to numeric in E10121 / R10121C5: '1'
## Warning: Coercing text to numeric in E10122 / R10122C5: '1'
## Warning: Coercing text to numeric in E10123 / R10123C5: '1'
## Warning: Coercing text to numeric in E10124 / R10124C5: '2'
## Warning: Coercing text to numeric in E10125 / R10125C5: '2'
## Warning: Coercing text to numeric in E10126 / R10126C5: '2'
## Warning: Coercing text to numeric in E10127 / R10127C5: '2'
## Warning: Coercing text to numeric in E10128 / R10128C5: '2'
## Warning: Coercing text to numeric in E10129 / R10129C5: '2'
## Warning: Coercing text to numeric in E10130 / R10130C5: '1'
## Warning: Coercing text to numeric in E10131 / R10131C5: '1'
## Warning: Coercing text to numeric in E10132 / R10132C5: '1'
## Warning: Coercing text to numeric in E10133 / R10133C5: '1'
## Warning: Coercing text to numeric in E10134 / R10134C5: '1'
## Warning: Coercing text to numeric in E10135 / R10135C5: '1'
## Warning: Coercing text to numeric in E10136 / R10136C5: '2'
## Warning: Coercing text to numeric in E10137 / R10137C5: '2'
## Warning: Coercing text to numeric in E10138 / R10138C5: '2'
## Warning: Coercing text to numeric in E10139 / R10139C5: '2'
## Warning: Coercing text to numeric in E10140 / R10140C5: '2'
## Warning: Coercing text to numeric in E10141 / R10141C5: '2'
## Warning: Coercing text to numeric in E10142 / R10142C5: '1'
## Warning: Coercing text to numeric in E10143 / R10143C5: '1'
## Warning: Coercing text to numeric in E10144 / R10144C5: '1'
## Warning: Coercing text to numeric in E10145 / R10145C5: '1'
## Warning: Coercing text to numeric in E10146 / R10146C5: '1'
## Warning: Coercing text to numeric in E10147 / R10147C5: '1'
## Warning: Coercing text to numeric in E10148 / R10148C5: '2'
## Warning: Coercing text to numeric in E10149 / R10149C5: '2'
## Warning: Coercing text to numeric in E10150 / R10150C5: '2'
## Warning: Coercing text to numeric in E10151 / R10151C5: '2'
## Warning: Coercing text to numeric in E10152 / R10152C5: '2'
## Warning: Coercing text to numeric in E10153 / R10153C5: '2'
## Warning: Coercing text to numeric in E10154 / R10154C5: '2'
## Warning: Coercing text to numeric in E10155 / R10155C5: '2'
## Warning: Coercing text to numeric in E10156 / R10156C5: '2'
## Warning: Coercing text to numeric in E10157 / R10157C5: '2'
## Warning: Coercing text to numeric in E10158 / R10158C5: '2'
## Warning: Coercing text to numeric in E10159 / R10159C5: '2'
## Warning: Coercing text to numeric in E10160 / R10160C5: '1'
## Warning: Coercing text to numeric in E10161 / R10161C5: '1'
## Warning: Coercing text to numeric in E10162 / R10162C5: '1'
## Warning: Coercing text to numeric in E10163 / R10163C5: '1'
## Warning: Coercing text to numeric in E10164 / R10164C5: '1'
## Warning: Coercing text to numeric in E10165 / R10165C5: '1'
## Warning: Coercing text to numeric in E10166 / R10166C5: '2'
## Warning: Coercing text to numeric in E10167 / R10167C5: '2'
## Warning: Coercing text to numeric in E10168 / R10168C5: '2'
## Warning: Coercing text to numeric in E10169 / R10169C5: '2'
## Warning: Coercing text to numeric in E10170 / R10170C5: '2'
## Warning: Coercing text to numeric in E10171 / R10171C5: '2'
## Warning: Coercing text to numeric in E10172 / R10172C5: '1'
## Warning: Coercing text to numeric in E10173 / R10173C5: '1'
## Warning: Coercing text to numeric in E10174 / R10174C5: '1'
## Warning: Coercing text to numeric in E10175 / R10175C5: '1'
## Warning: Coercing text to numeric in E10176 / R10176C5: '1'
## Warning: Coercing text to numeric in E10177 / R10177C5: '1'
## Warning: Coercing text to numeric in E10178 / R10178C5: '2'
## Warning: Coercing text to numeric in E10179 / R10179C5: '2'
## Warning: Coercing text to numeric in E10180 / R10180C5: '2'
## Warning: Coercing text to numeric in E10181 / R10181C5: '2'
## Warning: Coercing text to numeric in E10182 / R10182C5: '2'
## Warning: Coercing text to numeric in E10183 / R10183C5: '2'
## Warning: Coercing text to numeric in E10184 / R10184C5: '2'
## Warning: Coercing text to numeric in E10185 / R10185C5: '2'
## Warning: Coercing text to numeric in E10186 / R10186C5: '2'
## Warning: Coercing text to numeric in E10187 / R10187C5: '2'
## Warning: Coercing text to numeric in E10188 / R10188C5: '2'
## Warning: Coercing text to numeric in E10189 / R10189C5: '2'
## Warning: Coercing text to numeric in E10190 / R10190C5: '1'
## Warning: Coercing text to numeric in E10191 / R10191C5: '1'
## Warning: Coercing text to numeric in E10192 / R10192C5: '1'
## Warning: Coercing text to numeric in E10193 / R10193C5: '1'
## Warning: Coercing text to numeric in E10194 / R10194C5: '1'
## Warning: Coercing text to numeric in E10195 / R10195C5: '1'
## Warning: Coercing text to numeric in E10196 / R10196C5: '2'
## Warning: Coercing text to numeric in E10197 / R10197C5: '2'
## Warning: Coercing text to numeric in E10198 / R10198C5: '2'
## Warning: Coercing text to numeric in E10199 / R10199C5: '2'
## Warning: Coercing text to numeric in E10200 / R10200C5: '2'
## Warning: Coercing text to numeric in E10201 / R10201C5: '2'
## Warning: Coercing text to numeric in E10202 / R10202C5: '2'
## Warning: Coercing text to numeric in E10203 / R10203C5: '2'
## Warning: Coercing text to numeric in E10204 / R10204C5: '2'
## Warning: Coercing text to numeric in E10205 / R10205C5: '2'
## Warning: Coercing text to numeric in E10206 / R10206C5: '2'
## Warning: Coercing text to numeric in E10207 / R10207C5: '2'
## Warning: Coercing text to numeric in E10208 / R10208C5: '2'
## Warning: Coercing text to numeric in E10209 / R10209C5: '2'
## Warning: Coercing text to numeric in E10210 / R10210C5: '2'
## Warning: Coercing text to numeric in E10211 / R10211C5: '2'
## Warning: Coercing text to numeric in E10212 / R10212C5: '2'
## Warning: Coercing text to numeric in E10213 / R10213C5: '2'
## Warning: Coercing text to numeric in E10214 / R10214C5: '1'
## Warning: Coercing text to numeric in E10215 / R10215C5: '1'
## Warning: Coercing text to numeric in E10216 / R10216C5: '1'
## Warning: Coercing text to numeric in E10217 / R10217C5: '1'
## Warning: Coercing text to numeric in E10218 / R10218C5: '1'
## Warning: Coercing text to numeric in E10219 / R10219C5: '1'
## Warning: Coercing text to numeric in E10220 / R10220C5: '2'
## Warning: Coercing text to numeric in E10221 / R10221C5: '2'
## Warning: Coercing text to numeric in E10222 / R10222C5: '2'
## Warning: Coercing text to numeric in E10223 / R10223C5: '2'
## Warning: Coercing text to numeric in E10224 / R10224C5: '2'
## Warning: Coercing text to numeric in E10225 / R10225C5: '2'
## Warning: Coercing text to numeric in E10226 / R10226C5: '2'
## Warning: Coercing text to numeric in E10227 / R10227C5: '2'
## Warning: Coercing text to numeric in E10228 / R10228C5: '2'
## Warning: Coercing text to numeric in E10229 / R10229C5: '2'
## Warning: Coercing text to numeric in E10230 / R10230C5: '2'
## Warning: Coercing text to numeric in E10231 / R10231C5: '2'
## Warning: Coercing text to numeric in E10232 / R10232C5: '1'
## Warning: Coercing text to numeric in E10233 / R10233C5: '1'
## Warning: Coercing text to numeric in E10234 / R10234C5: '1'
## Warning: Coercing text to numeric in E10235 / R10235C5: '1'
## Warning: Coercing text to numeric in E10236 / R10236C5: '1'
## Warning: Coercing text to numeric in E10237 / R10237C5: '1'
## Warning: Coercing text to numeric in E10238 / R10238C5: '1'
## Warning: Coercing text to numeric in E10239 / R10239C5: '1'
## Warning: Coercing text to numeric in E10240 / R10240C5: '1'
## Warning: Coercing text to numeric in E10241 / R10241C5: '1'
## Warning: Coercing text to numeric in E10242 / R10242C5: '1'
## Warning: Coercing text to numeric in E10243 / R10243C5: '1'
## Warning: Coercing text to numeric in E10244 / R10244C5: '1'
## Warning: Coercing text to numeric in E10245 / R10245C5: '1'
## Warning: Coercing text to numeric in E10246 / R10246C5: '1'
## Warning: Coercing text to numeric in E10247 / R10247C5: '1'
## Warning: Coercing text to numeric in E10248 / R10248C5: '1'
## Warning: Coercing text to numeric in E10249 / R10249C5: '1'
## Warning: Coercing text to numeric in E10250 / R10250C5: '1'
## Warning: Coercing text to numeric in E10251 / R10251C5: '1'
## Warning: Coercing text to numeric in E10252 / R10252C5: '1'
## Warning: Coercing text to numeric in E10253 / R10253C5: '1'
## Warning: Coercing text to numeric in E10254 / R10254C5: '1'
## Warning: Coercing text to numeric in E10255 / R10255C5: '1'
## Warning: Coercing text to numeric in E10256 / R10256C5: '2'
## Warning: Coercing text to numeric in E10257 / R10257C5: '2'
## Warning: Coercing text to numeric in E10258 / R10258C5: '2'
## Warning: Coercing text to numeric in E10259 / R10259C5: '2'
## Warning: Coercing text to numeric in E10260 / R10260C5: '2'
## Warning: Coercing text to numeric in E10261 / R10261C5: '2'
## Warning: Coercing text to numeric in E10262 / R10262C5: '2'
## Warning: Coercing text to numeric in E10263 / R10263C5: '2'
## Warning: Coercing text to numeric in E10264 / R10264C5: '2'
## Warning: Coercing text to numeric in E10265 / R10265C5: '2'
## Warning: Coercing text to numeric in E10266 / R10266C5: '2'
## Warning: Coercing text to numeric in E10267 / R10267C5: '2'
## Warning: Coercing text to numeric in E10268 / R10268C5: '2'
## Warning: Coercing text to numeric in E10269 / R10269C5: '2'
## Warning: Coercing text to numeric in E10270 / R10270C5: '2'
## Warning: Coercing text to numeric in E10271 / R10271C5: '2'
## Warning: Coercing text to numeric in E10272 / R10272C5: '2'
## Warning: Coercing text to numeric in E10273 / R10273C5: '2'
## Warning: Coercing text to numeric in E10274 / R10274C5: '1'
## Warning: Coercing text to numeric in E10275 / R10275C5: '1'
## Warning: Coercing text to numeric in E10276 / R10276C5: '1'
## Warning: Coercing text to numeric in E10277 / R10277C5: '1'
## Warning: Coercing text to numeric in E10278 / R10278C5: '1'
## Warning: Coercing text to numeric in E10279 / R10279C5: '1'
## Warning: Coercing text to numeric in E10280 / R10280C5: '2'
## Warning: Coercing text to numeric in E10281 / R10281C5: '2'
## Warning: Coercing text to numeric in E10282 / R10282C5: '2'
## Warning: Coercing text to numeric in E10283 / R10283C5: '2'
## Warning: Coercing text to numeric in E10284 / R10284C5: '2'
## Warning: Coercing text to numeric in E10285 / R10285C5: '2'
## Warning: Coercing text to numeric in E10286 / R10286C5: '2'
## Warning: Coercing text to numeric in E10287 / R10287C5: '2'
## Warning: Coercing text to numeric in E10288 / R10288C5: '2'
## Warning: Coercing text to numeric in E10289 / R10289C5: '2'
## Warning: Coercing text to numeric in E10290 / R10290C5: '2'
## Warning: Coercing text to numeric in E10291 / R10291C5: '2'
## Warning: Coercing text to numeric in E10292 / R10292C5: '2'
## Warning: Coercing text to numeric in E10293 / R10293C5: '2'
## Warning: Coercing text to numeric in E10294 / R10294C5: '2'
## Warning: Coercing text to numeric in E10295 / R10295C5: '2'
## Warning: Coercing text to numeric in E10296 / R10296C5: '2'
## Warning: Coercing text to numeric in E10297 / R10297C5: '2'
## Warning: Coercing text to numeric in E10298 / R10298C5: '2'
## Warning: Coercing text to numeric in E10299 / R10299C5: '2'
## Warning: Coercing text to numeric in E10300 / R10300C5: '2'
## Warning: Coercing text to numeric in E10301 / R10301C5: '2'
## Warning: Coercing text to numeric in E10302 / R10302C5: '2'
## Warning: Coercing text to numeric in E10303 / R10303C5: '2'
## Warning: Coercing text to numeric in E10304 / R10304C5: '1'
## Warning: Coercing text to numeric in E10305 / R10305C5: '1'
## Warning: Coercing text to numeric in E10306 / R10306C5: '1'
## Warning: Coercing text to numeric in E10307 / R10307C5: '1'
## Warning: Coercing text to numeric in E10308 / R10308C5: '1'
## Warning: Coercing text to numeric in E10309 / R10309C5: '1'
## Warning: Coercing text to numeric in E10310 / R10310C5: '2'
## Warning: Coercing text to numeric in E10311 / R10311C5: '2'
## Warning: Coercing text to numeric in E10312 / R10312C5: '2'
## Warning: Coercing text to numeric in E10313 / R10313C5: '2'
## Warning: Coercing text to numeric in E10314 / R10314C5: '2'
## Warning: Coercing text to numeric in E10315 / R10315C5: '2'
## Warning: Coercing text to numeric in E10316 / R10316C5: '1'
## Warning: Coercing text to numeric in E10317 / R10317C5: '1'
## Warning: Coercing text to numeric in E10318 / R10318C5: '1'
## Warning: Coercing text to numeric in E10319 / R10319C5: '1'
## Warning: Coercing text to numeric in E10320 / R10320C5: '1'
## Warning: Coercing text to numeric in E10321 / R10321C5: '1'
## Warning: Coercing text to numeric in E10322 / R10322C5: '2'
## Warning: Coercing text to numeric in E10323 / R10323C5: '2'
## Warning: Coercing text to numeric in E10324 / R10324C5: '2'
## Warning: Coercing text to numeric in E10325 / R10325C5: '2'
## Warning: Coercing text to numeric in E10326 / R10326C5: '2'
## Warning: Coercing text to numeric in E10327 / R10327C5: '2'
## Warning: Coercing text to numeric in E10328 / R10328C5: '1'
## Warning: Coercing text to numeric in E10329 / R10329C5: '1'
## Warning: Coercing text to numeric in E10330 / R10330C5: '1'
## Warning: Coercing text to numeric in E10331 / R10331C5: '1'
## Warning: Coercing text to numeric in E10332 / R10332C5: '1'
## Warning: Coercing text to numeric in E10333 / R10333C5: '1'
## Warning: Coercing text to numeric in E10334 / R10334C5: '1'
## Warning: Coercing text to numeric in E10335 / R10335C5: '1'
## Warning: Coercing text to numeric in E10336 / R10336C5: '1'
## Warning: Coercing text to numeric in E10337 / R10337C5: '1'
## Warning: Coercing text to numeric in E10338 / R10338C5: '1'
## Warning: Coercing text to numeric in E10339 / R10339C5: '1'
## Warning: Coercing text to numeric in E10340 / R10340C5: '1'
## Warning: Coercing text to numeric in E10341 / R10341C5: '1'
## Warning: Coercing text to numeric in E10342 / R10342C5: '1'
## Warning: Coercing text to numeric in E10343 / R10343C5: '1'
## Warning: Coercing text to numeric in E10344 / R10344C5: '1'
## Warning: Coercing text to numeric in E10345 / R10345C5: '1'
## Warning: Coercing text to numeric in E10346 / R10346C5: '1'
## Warning: Coercing text to numeric in E10347 / R10347C5: '1'
## Warning: Coercing text to numeric in E10348 / R10348C5: '1'
## Warning: Coercing text to numeric in E10349 / R10349C5: '1'
## Warning: Coercing text to numeric in E10350 / R10350C5: '1'
## Warning: Coercing text to numeric in E10351 / R10351C5: '1'
## Warning: Coercing text to numeric in E10352 / R10352C5: '1'
## Warning: Coercing text to numeric in E10353 / R10353C5: '1'
## Warning: Coercing text to numeric in E10354 / R10354C5: '1'
## Warning: Coercing text to numeric in E10355 / R10355C5: '1'
## Warning: Coercing text to numeric in E10356 / R10356C5: '1'
## Warning: Coercing text to numeric in E10357 / R10357C5: '1'
## Warning: Coercing text to numeric in E10358 / R10358C5: '2'
## Warning: Coercing text to numeric in E10359 / R10359C5: '2'
## Warning: Coercing text to numeric in E10360 / R10360C5: '2'
## Warning: Coercing text to numeric in E10361 / R10361C5: '2'
## Warning: Coercing text to numeric in E10362 / R10362C5: '2'
## Warning: Coercing text to numeric in E10363 / R10363C5: '2'
## Warning: Coercing text to numeric in E10364 / R10364C5: '1'
## Warning: Coercing text to numeric in E10365 / R10365C5: '1'
## Warning: Coercing text to numeric in E10366 / R10366C5: '1'
## Warning: Coercing text to numeric in E10367 / R10367C5: '1'
## Warning: Coercing text to numeric in E10368 / R10368C5: '1'
## Warning: Coercing text to numeric in E10369 / R10369C5: '1'
## Warning: Coercing text to numeric in E10370 / R10370C5: '1'
## Warning: Coercing text to numeric in E10371 / R10371C5: '1'
## Warning: Coercing text to numeric in E10372 / R10372C5: '1'
## Warning: Coercing text to numeric in E10373 / R10373C5: '1'
## Warning: Coercing text to numeric in E10374 / R10374C5: '1'
## Warning: Coercing text to numeric in E10375 / R10375C5: '1'
## Warning: Coercing text to numeric in E10376 / R10376C5: '2'
## Warning: Coercing text to numeric in E10377 / R10377C5: '2'
## Warning: Coercing text to numeric in E10378 / R10378C5: '2'
## Warning: Coercing text to numeric in E10379 / R10379C5: '2'
## Warning: Coercing text to numeric in E10380 / R10380C5: '2'
## Warning: Coercing text to numeric in E10381 / R10381C5: '2'
## Warning: Coercing text to numeric in E10382 / R10382C5: '2'
## Warning: Coercing text to numeric in E10383 / R10383C5: '2'
## Warning: Coercing text to numeric in E10384 / R10384C5: '2'
## Warning: Coercing text to numeric in E10385 / R10385C5: '2'
## Warning: Coercing text to numeric in E10386 / R10386C5: '2'
## Warning: Coercing text to numeric in E10387 / R10387C5: '2'
## Warning: Coercing text to numeric in E10388 / R10388C5: '2'
## Warning: Coercing text to numeric in E10389 / R10389C5: '2'
## Warning: Coercing text to numeric in E10390 / R10390C5: '2'
## Warning: Coercing text to numeric in E10391 / R10391C5: '2'
## Warning: Coercing text to numeric in E10392 / R10392C5: '2'
## Warning: Coercing text to numeric in E10393 / R10393C5: '2'
## Warning: Coercing text to numeric in E10394 / R10394C5: '1'
## Warning: Coercing text to numeric in E10395 / R10395C5: '1'
## Warning: Coercing text to numeric in E10396 / R10396C5: '1'
## Warning: Coercing text to numeric in E10397 / R10397C5: '1'
## Warning: Coercing text to numeric in E10398 / R10398C5: '1'
## Warning: Coercing text to numeric in E10399 / R10399C5: '1'
## Warning: Coercing text to numeric in E10400 / R10400C5: '1'
## Warning: Coercing text to numeric in E10401 / R10401C5: '1'
## Warning: Coercing text to numeric in E10402 / R10402C5: '1'
## Warning: Coercing text to numeric in E10403 / R10403C5: '1'
## Warning: Coercing text to numeric in E10404 / R10404C5: '1'
## Warning: Coercing text to numeric in E10405 / R10405C5: '1'
## Warning: Coercing text to numeric in E10406 / R10406C5: '1'
## Warning: Coercing text to numeric in E10407 / R10407C5: '1'
## Warning: Coercing text to numeric in E10408 / R10408C5: '1'
## Warning: Coercing text to numeric in E10409 / R10409C5: '1'
## Warning: Coercing text to numeric in E10410 / R10410C5: '1'
## Warning: Coercing text to numeric in E10411 / R10411C5: '1'
## Warning: Coercing text to numeric in E10412 / R10412C5: '2'
## Warning: Coercing text to numeric in E10413 / R10413C5: '2'
## Warning: Coercing text to numeric in E10414 / R10414C5: '2'
## Warning: Coercing text to numeric in E10415 / R10415C5: '2'
## Warning: Coercing text to numeric in E10416 / R10416C5: '2'
## Warning: Coercing text to numeric in E10417 / R10417C5: '2'
## Warning: Coercing text to numeric in E10418 / R10418C5: '1'
## Warning: Coercing text to numeric in E10419 / R10419C5: '1'
## Warning: Coercing text to numeric in E10420 / R10420C5: '1'
## Warning: Coercing text to numeric in E10421 / R10421C5: '1'
## Warning: Coercing text to numeric in E10422 / R10422C5: '1'
## Warning: Coercing text to numeric in E10423 / R10423C5: '1'
## Warning: Coercing text to numeric in E10424 / R10424C5: '1'
## Warning: Coercing text to numeric in E10425 / R10425C5: '1'
## Warning: Coercing text to numeric in E10426 / R10426C5: '1'
## Warning: Coercing text to numeric in E10427 / R10427C5: '1'
## Warning: Coercing text to numeric in E10428 / R10428C5: '1'
## Warning: Coercing text to numeric in E10429 / R10429C5: '1'
## Warning: Coercing text to numeric in E10430 / R10430C5: '1'
## Warning: Coercing text to numeric in E10431 / R10431C5: '1'
## Warning: Coercing text to numeric in E10432 / R10432C5: '1'
## Warning: Coercing text to numeric in E10433 / R10433C5: '1'
## Warning: Coercing text to numeric in E10434 / R10434C5: '1'
## Warning: Coercing text to numeric in E10435 / R10435C5: '1'
## Warning: Coercing text to numeric in E10436 / R10436C5: '2'
## Warning: Coercing text to numeric in E10437 / R10437C5: '2'
## Warning: Coercing text to numeric in E10438 / R10438C5: '2'
## Warning: Coercing text to numeric in E10439 / R10439C5: '2'
## Warning: Coercing text to numeric in E10440 / R10440C5: '2'
## Warning: Coercing text to numeric in E10441 / R10441C5: '2'
## Warning: Coercing text to numeric in E10442 / R10442C5: '2'
## Warning: Coercing text to numeric in E10443 / R10443C5: '2'
## Warning: Coercing text to numeric in E10444 / R10444C5: '2'
## Warning: Coercing text to numeric in E10445 / R10445C5: '2'
## Warning: Coercing text to numeric in E10446 / R10446C5: '2'
## Warning: Coercing text to numeric in E10447 / R10447C5: '2'
## Warning: Coercing text to numeric in E10448 / R10448C5: '2'
## Warning: Coercing text to numeric in E10449 / R10449C5: '2'
## Warning: Coercing text to numeric in E10450 / R10450C5: '2'
## Warning: Coercing text to numeric in E10451 / R10451C5: '2'
## Warning: Coercing text to numeric in E10452 / R10452C5: '2'
## Warning: Coercing text to numeric in E10453 / R10453C5: '2'
## Warning: Coercing text to numeric in E10454 / R10454C5: '1'
## Warning: Coercing text to numeric in E10455 / R10455C5: '1'
## Warning: Coercing text to numeric in E10456 / R10456C5: '1'
## Warning: Coercing text to numeric in E10457 / R10457C5: '1'
## Warning: Coercing text to numeric in E10458 / R10458C5: '1'
## Warning: Coercing text to numeric in E10459 / R10459C5: '1'
## Warning: Coercing text to numeric in E10460 / R10460C5: '2'
## Warning: Coercing text to numeric in E10461 / R10461C5: '2'
## Warning: Coercing text to numeric in E10462 / R10462C5: '2'
## Warning: Coercing text to numeric in E10463 / R10463C5: '2'
## Warning: Coercing text to numeric in E10464 / R10464C5: '2'
## Warning: Coercing text to numeric in E10465 / R10465C5: '2'
## Warning: Coercing text to numeric in E10466 / R10466C5: '2'
## Warning: Coercing text to numeric in E10467 / R10467C5: '2'
## Warning: Coercing text to numeric in E10468 / R10468C5: '2'
## Warning: Coercing text to numeric in E10469 / R10469C5: '2'
## Warning: Coercing text to numeric in E10470 / R10470C5: '2'
## Warning: Coercing text to numeric in E10471 / R10471C5: '2'
## Warning: Coercing text to numeric in E10472 / R10472C5: '2'
## Warning: Coercing text to numeric in E10473 / R10473C5: '2'
## Warning: Coercing text to numeric in E10474 / R10474C5: '2'
## Warning: Coercing text to numeric in E10475 / R10475C5: '2'
## Warning: Coercing text to numeric in E10476 / R10476C5: '2'
## Warning: Coercing text to numeric in E10477 / R10477C5: '2'
## Warning: Coercing text to numeric in E10478 / R10478C5: '2'
## Warning: Coercing text to numeric in E10479 / R10479C5: '2'
## Warning: Coercing text to numeric in E10480 / R10480C5: '2'
## Warning: Coercing text to numeric in E10481 / R10481C5: '2'
## Warning: Coercing text to numeric in E10482 / R10482C5: '2'
## Warning: Coercing text to numeric in E10483 / R10483C5: '2'
## Warning: Coercing text to numeric in E10484 / R10484C5: '1'
## Warning: Coercing text to numeric in E10485 / R10485C5: '1'
## Warning: Coercing text to numeric in E10486 / R10486C5: '1'
## Warning: Coercing text to numeric in E10487 / R10487C5: '1'
## Warning: Coercing text to numeric in E10488 / R10488C5: '1'
## Warning: Coercing text to numeric in E10489 / R10489C5: '1'
## Warning: Coercing text to numeric in E10490 / R10490C5: '1'
## Warning: Coercing text to numeric in E10491 / R10491C5: '1'
## Warning: Coercing text to numeric in E10492 / R10492C5: '1'
## Warning: Coercing text to numeric in E10493 / R10493C5: '1'
## Warning: Coercing text to numeric in E10494 / R10494C5: '1'
## Warning: Coercing text to numeric in E10495 / R10495C5: '1'
## Warning: Coercing text to numeric in E10496 / R10496C5: '2'
## Warning: Coercing text to numeric in E10497 / R10497C5: '2'
## Warning: Coercing text to numeric in E10498 / R10498C5: '2'
## Warning: Coercing text to numeric in E10499 / R10499C5: '2'
## Warning: Coercing text to numeric in E10500 / R10500C5: '2'
## Warning: Coercing text to numeric in E10501 / R10501C5: '2'
## Warning: Coercing text to numeric in E10502 / R10502C5: '2'
## Warning: Coercing text to numeric in E10503 / R10503C5: '2'
## Warning: Coercing text to numeric in E10504 / R10504C5: '2'
## Warning: Coercing text to numeric in E10505 / R10505C5: '2'
## Warning: Coercing text to numeric in E10506 / R10506C5: '2'
## Warning: Coercing text to numeric in E10507 / R10507C5: '2'
## Warning: Coercing text to numeric in E10508 / R10508C5: '1'
## Warning: Coercing text to numeric in E10509 / R10509C5: '1'
## Warning: Coercing text to numeric in E10510 / R10510C5: '1'
## Warning: Coercing text to numeric in E10511 / R10511C5: '1'
## Warning: Coercing text to numeric in E10512 / R10512C5: '1'
## Warning: Coercing text to numeric in E10513 / R10513C5: '1'
## Warning: Coercing text to numeric in E10514 / R10514C5: '2'
## Warning: Coercing text to numeric in E10515 / R10515C5: '2'
## Warning: Coercing text to numeric in E10516 / R10516C5: '2'
## Warning: Coercing text to numeric in E10517 / R10517C5: '2'
## Warning: Coercing text to numeric in E10518 / R10518C5: '2'
## Warning: Coercing text to numeric in E10519 / R10519C5: '2'
## Warning: Coercing text to numeric in E10520 / R10520C5: '2'
## Warning: Coercing text to numeric in E10521 / R10521C5: '2'
## Warning: Coercing text to numeric in E10522 / R10522C5: '2'
## Warning: Coercing text to numeric in E10523 / R10523C5: '2'
## Warning: Coercing text to numeric in E10524 / R10524C5: '2'
## Warning: Coercing text to numeric in E10525 / R10525C5: '2'
## Warning: Coercing text to numeric in E10526 / R10526C5: '2'
## Warning: Coercing text to numeric in E10527 / R10527C5: '2'
## Warning: Coercing text to numeric in E10528 / R10528C5: '2'
## Warning: Coercing text to numeric in E10529 / R10529C5: '2'
## Warning: Coercing text to numeric in E10530 / R10530C5: '2'
## Warning: Coercing text to numeric in E10531 / R10531C5: '2'
## Warning: Coercing text to numeric in E10532 / R10532C5: '2'
## Warning: Coercing text to numeric in E10533 / R10533C5: '2'
## Warning: Coercing text to numeric in E10534 / R10534C5: '2'
## Warning: Coercing text to numeric in E10535 / R10535C5: '2'
## Warning: Coercing text to numeric in E10536 / R10536C5: '2'
## Warning: Coercing text to numeric in E10537 / R10537C5: '2'
## Warning: Coercing text to numeric in E10538 / R10538C5: '1'
## Warning: Coercing text to numeric in E10539 / R10539C5: '1'
## Warning: Coercing text to numeric in E10540 / R10540C5: '1'
## Warning: Coercing text to numeric in E10541 / R10541C5: '1'
## Warning: Coercing text to numeric in E10542 / R10542C5: '1'
## Warning: Coercing text to numeric in E10543 / R10543C5: '1'
## Warning: Coercing text to numeric in E10544 / R10544C5: '2'
## Warning: Coercing text to numeric in E10545 / R10545C5: '2'
## Warning: Coercing text to numeric in E10546 / R10546C5: '2'
## Warning: Coercing text to numeric in E10547 / R10547C5: '2'
## Warning: Coercing text to numeric in E10548 / R10548C5: '2'
## Warning: Coercing text to numeric in E10549 / R10549C5: '2'
## Warning: Coercing text to numeric in E10550 / R10550C5: '1'
## Warning: Coercing text to numeric in E10551 / R10551C5: '1'
## Warning: Coercing text to numeric in E10552 / R10552C5: '1'
## Warning: Coercing text to numeric in E10553 / R10553C5: '1'
## Warning: Coercing text to numeric in E10554 / R10554C5: '1'
## Warning: Coercing text to numeric in E10555 / R10555C5: '1'
## Warning: Coercing text to numeric in E10556 / R10556C5: '1'
## Warning: Coercing text to numeric in E10557 / R10557C5: '1'
## Warning: Coercing text to numeric in E10558 / R10558C5: '1'
## Warning: Coercing text to numeric in E10559 / R10559C5: '1'
## Warning: Coercing text to numeric in E10560 / R10560C5: '1'
## Warning: Coercing text to numeric in E10561 / R10561C5: '1'
## Warning: Coercing text to numeric in E10562 / R10562C5: '2'
## Warning: Coercing text to numeric in E10563 / R10563C5: '2'
## Warning: Coercing text to numeric in E10564 / R10564C5: '2'
## Warning: Coercing text to numeric in E10565 / R10565C5: '2'
## Warning: Coercing text to numeric in E10566 / R10566C5: '2'
## Warning: Coercing text to numeric in E10567 / R10567C5: '2'
## Warning: Coercing text to numeric in E10568 / R10568C5: '1'
## Warning: Coercing text to numeric in E10569 / R10569C5: '1'
## Warning: Coercing text to numeric in E10570 / R10570C5: '1'
## Warning: Coercing text to numeric in E10571 / R10571C5: '1'
## Warning: Coercing text to numeric in E10572 / R10572C5: '1'
## Warning: Coercing text to numeric in E10573 / R10573C5: '1'
## Warning: Coercing text to numeric in E10574 / R10574C5: '1'
## Warning: Coercing text to numeric in E10575 / R10575C5: '1'
## Warning: Coercing text to numeric in E10576 / R10576C5: '1'
## Warning: Coercing text to numeric in E10577 / R10577C5: '1'
## Warning: Coercing text to numeric in E10578 / R10578C5: '1'
## Warning: Coercing text to numeric in E10579 / R10579C5: '1'
## Warning: Coercing text to numeric in E10580 / R10580C5: '2'
## Warning: Coercing text to numeric in E10581 / R10581C5: '2'
## Warning: Coercing text to numeric in E10582 / R10582C5: '2'
## Warning: Coercing text to numeric in E10583 / R10583C5: '2'
## Warning: Coercing text to numeric in E10584 / R10584C5: '2'
## Warning: Coercing text to numeric in E10585 / R10585C5: '2'
## Warning: Coercing text to numeric in E10586 / R10586C5: '1'
## Warning: Coercing text to numeric in E10587 / R10587C5: '1'
## Warning: Coercing text to numeric in E10588 / R10588C5: '1'
## Warning: Coercing text to numeric in E10589 / R10589C5: '1'
## Warning: Coercing text to numeric in E10590 / R10590C5: '1'
## Warning: Coercing text to numeric in E10591 / R10591C5: '1'
## Warning: Coercing text to numeric in E10592 / R10592C5: '1'
## Warning: Coercing text to numeric in E10593 / R10593C5: '1'
## Warning: Coercing text to numeric in E10594 / R10594C5: '1'
## Warning: Coercing text to numeric in E10595 / R10595C5: '1'
## Warning: Coercing text to numeric in E10596 / R10596C5: '1'
## Warning: Coercing text to numeric in E10597 / R10597C5: '1'
## Warning: Coercing text to numeric in E10598 / R10598C5: '1'
## Warning: Coercing text to numeric in E10599 / R10599C5: '1'
## Warning: Coercing text to numeric in E10600 / R10600C5: '1'
## Warning: Coercing text to numeric in E10601 / R10601C5: '1'
## Warning: Coercing text to numeric in E10602 / R10602C5: '1'
## Warning: Coercing text to numeric in E10603 / R10603C5: '1'
## Warning: Coercing text to numeric in E10604 / R10604C5: '1'
## Warning: Coercing text to numeric in E10605 / R10605C5: '1'
## Warning: Coercing text to numeric in E10606 / R10606C5: '1'
## Warning: Coercing text to numeric in E10607 / R10607C5: '1'
## Warning: Coercing text to numeric in E10608 / R10608C5: '1'
## Warning: Coercing text to numeric in E10609 / R10609C5: '1'
## Warning: Coercing text to numeric in E10610 / R10610C5: '1'
## Warning: Coercing text to numeric in E10611 / R10611C5: '1'
## Warning: Coercing text to numeric in E10612 / R10612C5: '1'
## Warning: Coercing text to numeric in E10613 / R10613C5: '1'
## Warning: Coercing text to numeric in E10614 / R10614C5: '1'
## Warning: Coercing text to numeric in E10615 / R10615C5: '1'
## Warning: Coercing text to numeric in E10616 / R10616C5: '2'
## Warning: Coercing text to numeric in E10617 / R10617C5: '2'
## Warning: Coercing text to numeric in E10618 / R10618C5: '2'
## Warning: Coercing text to numeric in E10619 / R10619C5: '2'
## Warning: Coercing text to numeric in E10620 / R10620C5: '2'
## Warning: Coercing text to numeric in E10621 / R10621C5: '2'
## Warning: Coercing text to numeric in E10622 / R10622C5: '2'
## Warning: Coercing text to numeric in E10623 / R10623C5: '2'
## Warning: Coercing text to numeric in E10624 / R10624C5: '2'
## Warning: Coercing text to numeric in E10625 / R10625C5: '2'
## Warning: Coercing text to numeric in E10626 / R10626C5: '2'
## Warning: Coercing text to numeric in E10627 / R10627C5: '2'
## Warning: Coercing text to numeric in E10628 / R10628C5: '2'
## Warning: Coercing text to numeric in E10629 / R10629C5: '2'
## Warning: Coercing text to numeric in E10630 / R10630C5: '2'
## Warning: Coercing text to numeric in E10631 / R10631C5: '2'
## Warning: Coercing text to numeric in E10632 / R10632C5: '2'
## Warning: Coercing text to numeric in E10633 / R10633C5: '2'
## Warning: Coercing text to numeric in E10634 / R10634C5: '1'
## Warning: Coercing text to numeric in E10635 / R10635C5: '1'
## Warning: Coercing text to numeric in E10636 / R10636C5: '1'
## Warning: Coercing text to numeric in E10637 / R10637C5: '1'
## Warning: Coercing text to numeric in E10638 / R10638C5: '1'
## Warning: Coercing text to numeric in E10639 / R10639C5: '1'
## Warning: Coercing text to numeric in E10640 / R10640C5: '1'
## Warning: Coercing text to numeric in E10641 / R10641C5: '1'
## Warning: Coercing text to numeric in E10642 / R10642C5: '1'
## Warning: Coercing text to numeric in E10643 / R10643C5: '1'
## Warning: Coercing text to numeric in E10644 / R10644C5: '1'
## Warning: Coercing text to numeric in E10645 / R10645C5: '1'
## Warning: Coercing text to numeric in E10646 / R10646C5: '2'
## Warning: Coercing text to numeric in E10647 / R10647C5: '2'
## Warning: Coercing text to numeric in E10648 / R10648C5: '2'
## Warning: Coercing text to numeric in E10649 / R10649C5: '2'
## Warning: Coercing text to numeric in E10650 / R10650C5: '2'
## Warning: Coercing text to numeric in E10651 / R10651C5: '2'
## Warning: Coercing text to numeric in E10652 / R10652C5: '1'
## Warning: Coercing text to numeric in E10653 / R10653C5: '1'
## Warning: Coercing text to numeric in E10654 / R10654C5: '1'
## Warning: Coercing text to numeric in E10655 / R10655C5: '1'
## Warning: Coercing text to numeric in E10656 / R10656C5: '1'
## Warning: Coercing text to numeric in E10657 / R10657C5: '1'
## Warning: Coercing text to numeric in E10658 / R10658C5: '1'
## Warning: Coercing text to numeric in E10659 / R10659C5: '1'
## Warning: Coercing text to numeric in E10660 / R10660C5: '1'
## Warning: Coercing text to numeric in E10661 / R10661C5: '1'
## Warning: Coercing text to numeric in E10662 / R10662C5: '1'
## Warning: Coercing text to numeric in E10663 / R10663C5: '1'
## Warning: Coercing text to numeric in E10664 / R10664C5: '1'
## Warning: Coercing text to numeric in E10665 / R10665C5: '1'
## Warning: Coercing text to numeric in E10666 / R10666C5: '1'
## Warning: Coercing text to numeric in E10667 / R10667C5: '1'
## Warning: Coercing text to numeric in E10668 / R10668C5: '1'
## Warning: Coercing text to numeric in E10669 / R10669C5: '1'
## Warning: Coercing text to numeric in E10670 / R10670C5: '2'
## Warning: Coercing text to numeric in E10671 / R10671C5: '2'
## Warning: Coercing text to numeric in E10672 / R10672C5: '2'
## Warning: Coercing text to numeric in E10673 / R10673C5: '2'
## Warning: Coercing text to numeric in E10674 / R10674C5: '2'
## Warning: Coercing text to numeric in E10675 / R10675C5: '2'
## Warning: Coercing text to numeric in E10676 / R10676C5: '1'
## Warning: Coercing text to numeric in E10677 / R10677C5: '1'
## Warning: Coercing text to numeric in E10678 / R10678C5: '1'
## Warning: Coercing text to numeric in E10679 / R10679C5: '1'
## Warning: Coercing text to numeric in E10680 / R10680C5: '1'
## Warning: Coercing text to numeric in E10681 / R10681C5: '1'
## Warning: Coercing text to numeric in E10682 / R10682C5: '2'
## Warning: Coercing text to numeric in E10683 / R10683C5: '2'
## Warning: Coercing text to numeric in E10684 / R10684C5: '2'
## Warning: Coercing text to numeric in E10685 / R10685C5: '2'
## Warning: Coercing text to numeric in E10686 / R10686C5: '2'
## Warning: Coercing text to numeric in E10687 / R10687C5: '2'
## Warning: Coercing text to numeric in E10688 / R10688C5: '1'
## Warning: Coercing text to numeric in E10689 / R10689C5: '1'
## Warning: Coercing text to numeric in E10690 / R10690C5: '1'
## Warning: Coercing text to numeric in E10691 / R10691C5: '1'
## Warning: Coercing text to numeric in E10692 / R10692C5: '1'
## Warning: Coercing text to numeric in E10693 / R10693C5: '1'
## Warning: Coercing text to numeric in E10694 / R10694C5: '1'
## Warning: Coercing text to numeric in E10695 / R10695C5: '1'
## Warning: Coercing text to numeric in E10696 / R10696C5: '1'
## Warning: Coercing text to numeric in E10697 / R10697C5: '1'
## Warning: Coercing text to numeric in E10698 / R10698C5: '1'
## Warning: Coercing text to numeric in E10699 / R10699C5: '1'
## Warning: Coercing text to numeric in E10700 / R10700C5: '2'
## Warning: Coercing text to numeric in E10701 / R10701C5: '2'
## Warning: Coercing text to numeric in E10702 / R10702C5: '2'
## Warning: Coercing text to numeric in E10703 / R10703C5: '2'
## Warning: Coercing text to numeric in E10704 / R10704C5: '2'
## Warning: Coercing text to numeric in E10705 / R10705C5: '2'
## Warning: Coercing text to numeric in E10706 / R10706C5: '1'
## Warning: Coercing text to numeric in E10707 / R10707C5: '1'
## Warning: Coercing text to numeric in E10708 / R10708C5: '1'
## Warning: Coercing text to numeric in E10709 / R10709C5: '1'
## Warning: Coercing text to numeric in E10710 / R10710C5: '1'
## Warning: Coercing text to numeric in E10711 / R10711C5: '1'
## Warning: Coercing text to numeric in E10712 / R10712C5: '2'
## Warning: Coercing text to numeric in E10713 / R10713C5: '2'
## Warning: Coercing text to numeric in E10714 / R10714C5: '2'
## Warning: Coercing text to numeric in E10715 / R10715C5: '2'
## Warning: Coercing text to numeric in E10716 / R10716C5: '2'
## Warning: Coercing text to numeric in E10717 / R10717C5: '2'
## Warning: Coercing text to numeric in E10718 / R10718C5: '1'
## Warning: Coercing text to numeric in E10719 / R10719C5: '1'
## Warning: Coercing text to numeric in E10720 / R10720C5: '1'
## Warning: Coercing text to numeric in E10721 / R10721C5: '1'
## Warning: Coercing text to numeric in E10722 / R10722C5: '1'
## Warning: Coercing text to numeric in E10723 / R10723C5: '1'
## Warning: Coercing text to numeric in E10724 / R10724C5: '2'
## Warning: Coercing text to numeric in E10725 / R10725C5: '2'
## Warning: Coercing text to numeric in E10726 / R10726C5: '2'
## Warning: Coercing text to numeric in E10727 / R10727C5: '2'
## Warning: Coercing text to numeric in E10728 / R10728C5: '2'
## Warning: Coercing text to numeric in E10729 / R10729C5: '2'
## Warning: Coercing text to numeric in E10730 / R10730C5: '1'
## Warning: Coercing text to numeric in E10731 / R10731C5: '1'
## Warning: Coercing text to numeric in E10732 / R10732C5: '1'
## Warning: Coercing text to numeric in E10733 / R10733C5: '1'
## Warning: Coercing text to numeric in E10734 / R10734C5: '1'
## Warning: Coercing text to numeric in E10735 / R10735C5: '1'
## Warning: Coercing text to numeric in E10736 / R10736C5: '2'
## Warning: Coercing text to numeric in E10737 / R10737C5: '2'
## Warning: Coercing text to numeric in E10738 / R10738C5: '2'
## Warning: Coercing text to numeric in E10739 / R10739C5: '2'
## Warning: Coercing text to numeric in E10740 / R10740C5: '2'
## Warning: Coercing text to numeric in E10741 / R10741C5: '2'
## Warning: Coercing text to numeric in E10742 / R10742C5: '1'
## Warning: Coercing text to numeric in E10743 / R10743C5: '1'
## Warning: Coercing text to numeric in E10744 / R10744C5: '1'
## Warning: Coercing text to numeric in E10745 / R10745C5: '1'
## Warning: Coercing text to numeric in E10746 / R10746C5: '1'
## Warning: Coercing text to numeric in E10747 / R10747C5: '1'
## Warning: Coercing text to numeric in E10748 / R10748C5: '2'
## Warning: Coercing text to numeric in E10749 / R10749C5: '2'
## Warning: Coercing text to numeric in E10750 / R10750C5: '2'
## Warning: Coercing text to numeric in E10751 / R10751C5: '2'
## Warning: Coercing text to numeric in E10752 / R10752C5: '2'
## Warning: Coercing text to numeric in E10753 / R10753C5: '2'
## Warning: Coercing text to numeric in E10754 / R10754C5: '2'
## Warning: Coercing text to numeric in E10755 / R10755C5: '2'
## Warning: Coercing text to numeric in E10756 / R10756C5: '2'
## Warning: Coercing text to numeric in E10757 / R10757C5: '2'
## Warning: Coercing text to numeric in E10758 / R10758C5: '2'
## Warning: Coercing text to numeric in E10759 / R10759C5: '2'
## Warning: Coercing text to numeric in E10760 / R10760C5: '2'
## Warning: Coercing text to numeric in E10761 / R10761C5: '2'
## Warning: Coercing text to numeric in E10762 / R10762C5: '2'
## Warning: Coercing text to numeric in E10763 / R10763C5: '2'
## Warning: Coercing text to numeric in E10764 / R10764C5: '2'
## Warning: Coercing text to numeric in E10765 / R10765C5: '2'
## Warning: Coercing text to numeric in E10766 / R10766C5: '2'
## Warning: Coercing text to numeric in E10767 / R10767C5: '2'
## Warning: Coercing text to numeric in E10768 / R10768C5: '2'
## Warning: Coercing text to numeric in E10769 / R10769C5: '2'
## Warning: Coercing text to numeric in E10770 / R10770C5: '2'
## Warning: Coercing text to numeric in E10771 / R10771C5: '2'
## Warning: Coercing text to numeric in E10772 / R10772C5: '2'
## Warning: Coercing text to numeric in E10773 / R10773C5: '2'
## Warning: Coercing text to numeric in E10774 / R10774C5: '2'
## Warning: Coercing text to numeric in E10775 / R10775C5: '2'
## Warning: Coercing text to numeric in E10776 / R10776C5: '2'
## Warning: Coercing text to numeric in E10777 / R10777C5: '2'
## Warning: Coercing text to numeric in E10778 / R10778C5: '1'
## Warning: Coercing text to numeric in E10779 / R10779C5: '1'
## Warning: Coercing text to numeric in E10780 / R10780C5: '1'
## Warning: Coercing text to numeric in E10781 / R10781C5: '1'
## Warning: Coercing text to numeric in E10782 / R10782C5: '1'
## Warning: Coercing text to numeric in E10783 / R10783C5: '1'
## Warning: Coercing text to numeric in E10784 / R10784C5: '1'
## Warning: Coercing text to numeric in E10785 / R10785C5: '1'
## Warning: Coercing text to numeric in E10786 / R10786C5: '1'
## Warning: Coercing text to numeric in E10787 / R10787C5: '1'
## Warning: Coercing text to numeric in E10788 / R10788C5: '1'
## Warning: Coercing text to numeric in E10789 / R10789C5: '1'
## Warning: Coercing text to numeric in E10790 / R10790C5: '2'
## Warning: Coercing text to numeric in E10791 / R10791C5: '2'
## Warning: Coercing text to numeric in E10792 / R10792C5: '2'
## Warning: Coercing text to numeric in E10793 / R10793C5: '2'
## Warning: Coercing text to numeric in E10794 / R10794C5: '2'
## Warning: Coercing text to numeric in E10795 / R10795C5: '2'
## Warning: Coercing text to numeric in E10796 / R10796C5: '1'
## Warning: Coercing text to numeric in E10797 / R10797C5: '1'
## Warning: Coercing text to numeric in E10798 / R10798C5: '1'
## Warning: Coercing text to numeric in E10799 / R10799C5: '1'
## Warning: Coercing text to numeric in E10800 / R10800C5: '1'
## Warning: Coercing text to numeric in E10801 / R10801C5: '1'
## Warning: Coercing text to numeric in E10802 / R10802C5: '2'
## Warning: Coercing text to numeric in E10803 / R10803C5: '2'
## Warning: Coercing text to numeric in E10804 / R10804C5: '2'
## Warning: Coercing text to numeric in E10805 / R10805C5: '2'
## Warning: Coercing text to numeric in E10806 / R10806C5: '2'
## Warning: Coercing text to numeric in E10807 / R10807C5: '2'
## Warning: Coercing text to numeric in E10808 / R10808C5: '1'
## Warning: Coercing text to numeric in E10809 / R10809C5: '1'
## Warning: Coercing text to numeric in E10810 / R10810C5: '1'
## Warning: Coercing text to numeric in E10811 / R10811C5: '1'
## Warning: Coercing text to numeric in E10812 / R10812C5: '1'
## Warning: Coercing text to numeric in E10813 / R10813C5: '1'
## Warning: Coercing text to numeric in E10814 / R10814C5: '2'
## Warning: Coercing text to numeric in E10815 / R10815C5: '2'
## Warning: Coercing text to numeric in E10816 / R10816C5: '2'
## Warning: Coercing text to numeric in E10817 / R10817C5: '2'
## Warning: Coercing text to numeric in E10818 / R10818C5: '2'
## Warning: Coercing text to numeric in E10819 / R10819C5: '2'
## Warning: Coercing text to numeric in E10820 / R10820C5: '2'
## Warning: Coercing text to numeric in E10821 / R10821C5: '2'
## Warning: Coercing text to numeric in E10822 / R10822C5: '2'
## Warning: Coercing text to numeric in E10823 / R10823C5: '2'
## Warning: Coercing text to numeric in E10824 / R10824C5: '2'
## Warning: Coercing text to numeric in E10825 / R10825C5: '2'
## Warning: Coercing text to numeric in E10826 / R10826C5: '2'
## Warning: Coercing text to numeric in E10827 / R10827C5: '2'
## Warning: Coercing text to numeric in E10828 / R10828C5: '2'
## Warning: Coercing text to numeric in E10829 / R10829C5: '2'
## Warning: Coercing text to numeric in E10830 / R10830C5: '2'
## Warning: Coercing text to numeric in E10831 / R10831C5: '2'
## Warning: Coercing text to numeric in E10832 / R10832C5: '2'
## Warning: Coercing text to numeric in E10833 / R10833C5: '2'
## Warning: Coercing text to numeric in E10834 / R10834C5: '2'
## Warning: Coercing text to numeric in E10835 / R10835C5: '2'
## Warning: Coercing text to numeric in E10836 / R10836C5: '2'
## Warning: Coercing text to numeric in E10837 / R10837C5: '2'
## Warning: Coercing text to numeric in E10838 / R10838C5: '1'
## Warning: Coercing text to numeric in E10839 / R10839C5: '1'
## Warning: Coercing text to numeric in E10840 / R10840C5: '1'
## Warning: Coercing text to numeric in E10841 / R10841C5: '1'
## Warning: Coercing text to numeric in E10842 / R10842C5: '1'
## Warning: Coercing text to numeric in E10843 / R10843C5: '1'
## Warning: Coercing text to numeric in E10844 / R10844C5: '2'
## Warning: Coercing text to numeric in E10845 / R10845C5: '2'
## Warning: Coercing text to numeric in E10846 / R10846C5: '2'
## Warning: Coercing text to numeric in E10847 / R10847C5: '2'
## Warning: Coercing text to numeric in E10848 / R10848C5: '2'
## Warning: Coercing text to numeric in E10849 / R10849C5: '2'
## Warning: Coercing text to numeric in E10850 / R10850C5: '1'
## Warning: Coercing text to numeric in E10851 / R10851C5: '1'
## Warning: Coercing text to numeric in E10852 / R10852C5: '1'
## Warning: Coercing text to numeric in E10853 / R10853C5: '1'
## Warning: Coercing text to numeric in E10854 / R10854C5: '1'
## Warning: Coercing text to numeric in E10855 / R10855C5: '1'
## Warning: Coercing text to numeric in E10856 / R10856C5: '2'
## Warning: Coercing text to numeric in E10857 / R10857C5: '2'
## Warning: Coercing text to numeric in E10858 / R10858C5: '2'
## Warning: Coercing text to numeric in E10859 / R10859C5: '2'
## Warning: Coercing text to numeric in E10860 / R10860C5: '2'
## Warning: Coercing text to numeric in E10861 / R10861C5: '2'
## Warning: Coercing text to numeric in E10862 / R10862C5: '2'
## Warning: Coercing text to numeric in E10863 / R10863C5: '2'
## Warning: Coercing text to numeric in E10864 / R10864C5: '2'
## Warning: Coercing text to numeric in E10865 / R10865C5: '2'
## Warning: Coercing text to numeric in E10866 / R10866C5: '2'
## Warning: Coercing text to numeric in E10867 / R10867C5: '2'
## Warning: Coercing text to numeric in E10868 / R10868C5: '1'
## Warning: Coercing text to numeric in E10869 / R10869C5: '1'
## Warning: Coercing text to numeric in E10870 / R10870C5: '1'
## Warning: Coercing text to numeric in E10871 / R10871C5: '1'
## Warning: Coercing text to numeric in E10872 / R10872C5: '1'
## Warning: Coercing text to numeric in E10873 / R10873C5: '1'
## Warning: Coercing text to numeric in E10874 / R10874C5: '1'
## Warning: Coercing text to numeric in E10875 / R10875C5: '1'
## Warning: Coercing text to numeric in E10876 / R10876C5: '1'
## Warning: Coercing text to numeric in E10877 / R10877C5: '1'
## Warning: Coercing text to numeric in E10878 / R10878C5: '1'
## Warning: Coercing text to numeric in E10879 / R10879C5: '1'
## Warning: Coercing text to numeric in E10880 / R10880C5: '1'
## Warning: Coercing text to numeric in E10881 / R10881C5: '1'
## Warning: Coercing text to numeric in E10882 / R10882C5: '1'
## Warning: Coercing text to numeric in E10883 / R10883C5: '1'
## Warning: Coercing text to numeric in E10884 / R10884C5: '1'
## Warning: Coercing text to numeric in E10885 / R10885C5: '1'
## Warning: Coercing text to numeric in E10886 / R10886C5: '1'
## Warning: Coercing text to numeric in E10887 / R10887C5: '1'
## Warning: Coercing text to numeric in E10888 / R10888C5: '1'
## Warning: Coercing text to numeric in E10889 / R10889C5: '1'
## Warning: Coercing text to numeric in E10890 / R10890C5: '1'
## Warning: Coercing text to numeric in E10891 / R10891C5: '1'
## Warning: Coercing text to numeric in E10892 / R10892C5: '1'
## Warning: Coercing text to numeric in E10893 / R10893C5: '1'
## Warning: Coercing text to numeric in E10894 / R10894C5: '1'
## Warning: Coercing text to numeric in E10895 / R10895C5: '1'
## Warning: Coercing text to numeric in E10896 / R10896C5: '1'
## Warning: Coercing text to numeric in E10897 / R10897C5: '1'
## Warning: Coercing text to numeric in E10898 / R10898C5: '1'
## Warning: Coercing text to numeric in E10899 / R10899C5: '1'
## Warning: Coercing text to numeric in E10900 / R10900C5: '1'
## Warning: Coercing text to numeric in E10901 / R10901C5: '1'
## Warning: Coercing text to numeric in E10902 / R10902C5: '1'
## Warning: Coercing text to numeric in E10903 / R10903C5: '1'
## Warning: Coercing text to numeric in E10904 / R10904C5: '2'
## Warning: Coercing text to numeric in E10905 / R10905C5: '2'
## Warning: Coercing text to numeric in E10906 / R10906C5: '2'
## Warning: Coercing text to numeric in E10907 / R10907C5: '2'
## Warning: Coercing text to numeric in E10908 / R10908C5: '2'
## Warning: Coercing text to numeric in E10909 / R10909C5: '2'
## Warning: Coercing text to numeric in E10910 / R10910C5: '2'
## Warning: Coercing text to numeric in E10911 / R10911C5: '2'
## Warning: Coercing text to numeric in E10912 / R10912C5: '2'
## Warning: Coercing text to numeric in E10913 / R10913C5: '2'
## Warning: Coercing text to numeric in E10914 / R10914C5: '2'
## Warning: Coercing text to numeric in E10915 / R10915C5: '2'
## Warning: Coercing text to numeric in E10916 / R10916C5: '2'
## Warning: Coercing text to numeric in E10917 / R10917C5: '2'
## Warning: Coercing text to numeric in E10918 / R10918C5: '2'
## Warning: Coercing text to numeric in E10919 / R10919C5: '2'
## Warning: Coercing text to numeric in E10920 / R10920C5: '2'
## Warning: Coercing text to numeric in E10921 / R10921C5: '2'
## Warning: Coercing text to numeric in E10922 / R10922C5: '2'
## Warning: Coercing text to numeric in E10923 / R10923C5: '2'
## Warning: Coercing text to numeric in E10924 / R10924C5: '2'
## Warning: Coercing text to numeric in E10925 / R10925C5: '2'
## Warning: Coercing text to numeric in E10926 / R10926C5: '2'
## Warning: Coercing text to numeric in E10927 / R10927C5: '2'
## Warning: Coercing text to numeric in E10928 / R10928C5: '1'
## Warning: Coercing text to numeric in E10929 / R10929C5: '1'
## Warning: Coercing text to numeric in E10930 / R10930C5: '1'
## Warning: Coercing text to numeric in E10931 / R10931C5: '1'
## Warning: Coercing text to numeric in E10932 / R10932C5: '1'
## Warning: Coercing text to numeric in E10933 / R10933C5: '1'
## Warning: Coercing text to numeric in E10934 / R10934C5: '1'
## Warning: Coercing text to numeric in E10935 / R10935C5: '1'
## Warning: Coercing text to numeric in E10936 / R10936C5: '1'
## Warning: Coercing text to numeric in E10937 / R10937C5: '1'
## Warning: Coercing text to numeric in E10938 / R10938C5: '1'
## Warning: Coercing text to numeric in E10939 / R10939C5: '1'
## Warning: Coercing text to numeric in E10940 / R10940C5: '2'
## Warning: Coercing text to numeric in E10941 / R10941C5: '2'
## Warning: Coercing text to numeric in E10942 / R10942C5: '2'
## Warning: Coercing text to numeric in E10943 / R10943C5: '2'
## Warning: Coercing text to numeric in E10944 / R10944C5: '2'
## Warning: Coercing text to numeric in E10945 / R10945C5: '2'
## Warning: Coercing text to numeric in E10946 / R10946C5: '2'
## Warning: Coercing text to numeric in E10947 / R10947C5: '2'
## Warning: Coercing text to numeric in E10948 / R10948C5: '2'
## Warning: Coercing text to numeric in E10949 / R10949C5: '2'
## Warning: Coercing text to numeric in E10950 / R10950C5: '2'
## Warning: Coercing text to numeric in E10951 / R10951C5: '2'
## Warning: Coercing text to numeric in E10952 / R10952C5: '2'
## Warning: Coercing text to numeric in E10953 / R10953C5: '2'
## Warning: Coercing text to numeric in E10954 / R10954C5: '2'
## Warning: Coercing text to numeric in E10955 / R10955C5: '2'
## Warning: Coercing text to numeric in E10956 / R10956C5: '2'
## Warning: Coercing text to numeric in E10957 / R10957C5: '2'
## Warning: Coercing text to numeric in E10958 / R10958C5: '2'
## Warning: Coercing text to numeric in E10959 / R10959C5: '2'
## Warning: Coercing text to numeric in E10960 / R10960C5: '2'
## Warning: Coercing text to numeric in E10961 / R10961C5: '2'
## Warning: Coercing text to numeric in E10962 / R10962C5: '2'
## Warning: Coercing text to numeric in E10963 / R10963C5: '2'
## Warning: Coercing text to numeric in E10964 / R10964C5: '2'
## Warning: Coercing text to numeric in E10965 / R10965C5: '2'
## Warning: Coercing text to numeric in E10966 / R10966C5: '2'
## Warning: Coercing text to numeric in E10967 / R10967C5: '2'
## Warning: Coercing text to numeric in E10968 / R10968C5: '2'
## Warning: Coercing text to numeric in E10969 / R10969C5: '2'
## Warning: Coercing text to numeric in E10970 / R10970C5: '1'
## Warning: Coercing text to numeric in E10971 / R10971C5: '1'
## Warning: Coercing text to numeric in E10972 / R10972C5: '1'
## Warning: Coercing text to numeric in E10973 / R10973C5: '1'
## Warning: Coercing text to numeric in E10974 / R10974C5: '1'
## Warning: Coercing text to numeric in E10975 / R10975C5: '1'
## Warning: Coercing text to numeric in E10976 / R10976C5: '2'
## Warning: Coercing text to numeric in E10977 / R10977C5: '2'
## Warning: Coercing text to numeric in E10978 / R10978C5: '2'
## Warning: Coercing text to numeric in E10979 / R10979C5: '2'
## Warning: Coercing text to numeric in E10980 / R10980C5: '2'
## Warning: Coercing text to numeric in E10981 / R10981C5: '2'
## Warning: Coercing text to numeric in E10982 / R10982C5: '1'
## Warning: Coercing text to numeric in E10983 / R10983C5: '1'
## Warning: Coercing text to numeric in E10984 / R10984C5: '1'
## Warning: Coercing text to numeric in E10985 / R10985C5: '1'
## Warning: Coercing text to numeric in E10986 / R10986C5: '1'
## Warning: Coercing text to numeric in E10987 / R10987C5: '1'
## Warning: Coercing text to numeric in E10988 / R10988C5: '1'
## Warning: Coercing text to numeric in E10989 / R10989C5: '1'
## Warning: Coercing text to numeric in E10990 / R10990C5: '1'
## Warning: Coercing text to numeric in E10991 / R10991C5: '1'
## Warning: Coercing text to numeric in E10992 / R10992C5: '1'
## Warning: Coercing text to numeric in E10993 / R10993C5: '1'
## Warning: Coercing text to numeric in E10994 / R10994C5: '1'
## Warning: Coercing text to numeric in E10995 / R10995C5: '1'
## Warning: Coercing text to numeric in E10996 / R10996C5: '1'
## Warning: Coercing text to numeric in E10997 / R10997C5: '1'
## Warning: Coercing text to numeric in E10998 / R10998C5: '1'
## Warning: Coercing text to numeric in E10999 / R10999C5: '1'
## Warning: Coercing text to numeric in E11000 / R11000C5: '2'
## Warning: Coercing text to numeric in E11001 / R11001C5: '2'
## Warning: Coercing text to numeric in E11002 / R11002C5: '2'
## Warning: Coercing text to numeric in E11003 / R11003C5: '2'
## Warning: Coercing text to numeric in E11004 / R11004C5: '2'
## Warning: Coercing text to numeric in E11005 / R11005C5: '2'
## Warning: Coercing text to numeric in E11006 / R11006C5: '1'
## Warning: Coercing text to numeric in E11007 / R11007C5: '1'
## Warning: Coercing text to numeric in E11008 / R11008C5: '1'
## Warning: Coercing text to numeric in E11009 / R11009C5: '1'
## Warning: Coercing text to numeric in E11010 / R11010C5: '1'
## Warning: Coercing text to numeric in E11011 / R11011C5: '1'
## Warning: Coercing text to numeric in E11012 / R11012C5: '2'
## Warning: Coercing text to numeric in E11013 / R11013C5: '2'
## Warning: Coercing text to numeric in E11014 / R11014C5: '2'
## Warning: Coercing text to numeric in E11015 / R11015C5: '2'
## Warning: Coercing text to numeric in E11016 / R11016C5: '2'
## Warning: Coercing text to numeric in E11017 / R11017C5: '2'
## Warning: Coercing text to numeric in E11018 / R11018C5: '2'
## Warning: Coercing text to numeric in E11019 / R11019C5: '2'
## Warning: Coercing text to numeric in E11020 / R11020C5: '2'
## Warning: Coercing text to numeric in E11021 / R11021C5: '2'
## Warning: Coercing text to numeric in E11022 / R11022C5: '2'
## Warning: Coercing text to numeric in E11023 / R11023C5: '2'
## Warning: Coercing text to numeric in E11024 / R11024C5: '2'
## Warning: Coercing text to numeric in E11025 / R11025C5: '2'
## Warning: Coercing text to numeric in E11026 / R11026C5: '2'
## Warning: Coercing text to numeric in E11027 / R11027C5: '2'
## Warning: Coercing text to numeric in E11028 / R11028C5: '2'
## Warning: Coercing text to numeric in E11029 / R11029C5: '2'
## Warning: Coercing text to numeric in E11030 / R11030C5: '1'
## Warning: Coercing text to numeric in E11031 / R11031C5: '1'
## Warning: Coercing text to numeric in E11032 / R11032C5: '1'
## Warning: Coercing text to numeric in E11033 / R11033C5: '1'
## Warning: Coercing text to numeric in E11034 / R11034C5: '1'
## Warning: Coercing text to numeric in E11035 / R11035C5: '1'
## Warning: Coercing text to numeric in E11036 / R11036C5: '2'
## Warning: Coercing text to numeric in E11037 / R11037C5: '2'
## Warning: Coercing text to numeric in E11038 / R11038C5: '2'
## Warning: Coercing text to numeric in E11039 / R11039C5: '2'
## Warning: Coercing text to numeric in E11040 / R11040C5: '2'
## Warning: Coercing text to numeric in E11041 / R11041C5: '2'
## Warning: Coercing text to numeric in E11042 / R11042C5: '1'
## Warning: Coercing text to numeric in E11043 / R11043C5: '1'
## Warning: Coercing text to numeric in E11044 / R11044C5: '1'
## Warning: Coercing text to numeric in E11045 / R11045C5: '1'
## Warning: Coercing text to numeric in E11046 / R11046C5: '1'
## Warning: Coercing text to numeric in E11047 / R11047C5: '1'
## Warning: Coercing text to numeric in E11048 / R11048C5: '1'
## Warning: Coercing text to numeric in E11049 / R11049C5: '1'
## Warning: Coercing text to numeric in E11050 / R11050C5: '1'
## Warning: Coercing text to numeric in E11051 / R11051C5: '1'
## Warning: Coercing text to numeric in E11052 / R11052C5: '1'
## Warning: Coercing text to numeric in E11053 / R11053C5: '1'
## Warning: Coercing text to numeric in E11054 / R11054C5: '1'
## Warning: Coercing text to numeric in E11055 / R11055C5: '1'
## Warning: Coercing text to numeric in E11056 / R11056C5: '1'
## Warning: Coercing text to numeric in E11057 / R11057C5: '1'
## Warning: Coercing text to numeric in E11058 / R11058C5: '1'
## Warning: Coercing text to numeric in E11059 / R11059C5: '1'
## Warning: Coercing text to numeric in E11060 / R11060C5: '1'
## Warning: Coercing text to numeric in E11061 / R11061C5: '1'
## Warning: Coercing text to numeric in E11062 / R11062C5: '1'
## Warning: Coercing text to numeric in E11063 / R11063C5: '1'
## Warning: Coercing text to numeric in E11064 / R11064C5: '1'
## Warning: Coercing text to numeric in E11065 / R11065C5: '1'
## Warning: Coercing text to numeric in E11066 / R11066C5: '1'
## Warning: Coercing text to numeric in E11067 / R11067C5: '1'
## Warning: Coercing text to numeric in E11068 / R11068C5: '1'
## Warning: Coercing text to numeric in E11069 / R11069C5: '1'
## Warning: Coercing text to numeric in E11070 / R11070C5: '1'
## Warning: Coercing text to numeric in E11071 / R11071C5: '1'
## Warning: Coercing text to numeric in E11072 / R11072C5: '1'
## Warning: Coercing text to numeric in E11073 / R11073C5: '1'
## Warning: Coercing text to numeric in E11074 / R11074C5: '1'
## Warning: Coercing text to numeric in E11075 / R11075C5: '1'
## Warning: Coercing text to numeric in E11076 / R11076C5: '1'
## Warning: Coercing text to numeric in E11077 / R11077C5: '1'
## Warning: Coercing text to numeric in E11078 / R11078C5: '2'
## Warning: Coercing text to numeric in E11079 / R11079C5: '2'
## Warning: Coercing text to numeric in E11080 / R11080C5: '2'
## Warning: Coercing text to numeric in E11081 / R11081C5: '2'
## Warning: Coercing text to numeric in E11082 / R11082C5: '2'
## Warning: Coercing text to numeric in E11083 / R11083C5: '2'
## Warning: Coercing text to numeric in E11084 / R11084C5: '1'
## Warning: Coercing text to numeric in E11085 / R11085C5: '1'
## Warning: Coercing text to numeric in E11086 / R11086C5: '1'
## Warning: Coercing text to numeric in E11087 / R11087C5: '1'
## Warning: Coercing text to numeric in E11088 / R11088C5: '1'
## Warning: Coercing text to numeric in E11089 / R11089C5: '1'
## Warning: Coercing text to numeric in E11090 / R11090C5: '1'
## Warning: Coercing text to numeric in E11091 / R11091C5: '1'
## Warning: Coercing text to numeric in E11092 / R11092C5: '1'
## Warning: Coercing text to numeric in E11093 / R11093C5: '1'
## Warning: Coercing text to numeric in E11094 / R11094C5: '1'
## Warning: Coercing text to numeric in E11095 / R11095C5: '1'
## Warning: Coercing text to numeric in E11096 / R11096C5: '2'
## Warning: Coercing text to numeric in E11097 / R11097C5: '2'
## Warning: Coercing text to numeric in E11098 / R11098C5: '2'
## Warning: Coercing text to numeric in E11099 / R11099C5: '2'
## Warning: Coercing text to numeric in E11100 / R11100C5: '2'
## Warning: Coercing text to numeric in E11101 / R11101C5: '2'
## Warning: Coercing text to numeric in E11102 / R11102C5: '2'
## Warning: Coercing text to numeric in E11103 / R11103C5: '2'
## Warning: Coercing text to numeric in E11104 / R11104C5: '2'
## Warning: Coercing text to numeric in E11105 / R11105C5: '2'
## Warning: Coercing text to numeric in E11106 / R11106C5: '2'
## Warning: Coercing text to numeric in E11107 / R11107C5: '2'
## Warning: Coercing text to numeric in E11108 / R11108C5: '1'
## Warning: Coercing text to numeric in E11109 / R11109C5: '1'
## Warning: Coercing text to numeric in E11110 / R11110C5: '1'
## Warning: Coercing text to numeric in E11111 / R11111C5: '1'
## Warning: Coercing text to numeric in E11112 / R11112C5: '1'
## Warning: Coercing text to numeric in E11113 / R11113C5: '1'
## Warning: Coercing text to numeric in E11114 / R11114C5: '1'
## Warning: Coercing text to numeric in E11115 / R11115C5: '1'
## Warning: Coercing text to numeric in E11116 / R11116C5: '1'
## Warning: Coercing text to numeric in E11117 / R11117C5: '1'
## Warning: Coercing text to numeric in E11118 / R11118C5: '1'
## Warning: Coercing text to numeric in E11119 / R11119C5: '1'
## Warning: Coercing text to numeric in E11120 / R11120C5: '1'
## Warning: Coercing text to numeric in E11121 / R11121C5: '1'
## Warning: Coercing text to numeric in E11122 / R11122C5: '1'
## Warning: Coercing text to numeric in E11123 / R11123C5: '1'
## Warning: Coercing text to numeric in E11124 / R11124C5: '1'
## Warning: Coercing text to numeric in E11125 / R11125C5: '1'
## Warning: Coercing text to numeric in E11126 / R11126C5: '1'
## Warning: Coercing text to numeric in E11127 / R11127C5: '1'
## Warning: Coercing text to numeric in E11128 / R11128C5: '1'
## Warning: Coercing text to numeric in E11129 / R11129C5: '1'
## Warning: Coercing text to numeric in E11130 / R11130C5: '1'
## Warning: Coercing text to numeric in E11131 / R11131C5: '1'
## Warning: Coercing text to numeric in E11132 / R11132C5: '2'
## Warning: Coercing text to numeric in E11133 / R11133C5: '2'
## Warning: Coercing text to numeric in E11134 / R11134C5: '2'
## Warning: Coercing text to numeric in E11135 / R11135C5: '2'
## Warning: Coercing text to numeric in E11136 / R11136C5: '2'
## Warning: Coercing text to numeric in E11137 / R11137C5: '2'
## Warning: Coercing text to numeric in E11138 / R11138C5: '1'
## Warning: Coercing text to numeric in E11139 / R11139C5: '1'
## Warning: Coercing text to numeric in E11140 / R11140C5: '1'
## Warning: Coercing text to numeric in E11141 / R11141C5: '1'
## Warning: Coercing text to numeric in E11142 / R11142C5: '1'
## Warning: Coercing text to numeric in E11143 / R11143C5: '1'
## Warning: Coercing text to numeric in E11144 / R11144C5: '1'
## Warning: Coercing text to numeric in E11145 / R11145C5: '1'
## Warning: Coercing text to numeric in E11146 / R11146C5: '1'
## Warning: Coercing text to numeric in E11147 / R11147C5: '1'
## Warning: Coercing text to numeric in E11148 / R11148C5: '1'
## Warning: Coercing text to numeric in E11149 / R11149C5: '1'
## Warning: Coercing text to numeric in E11150 / R11150C5: '1'
## Warning: Coercing text to numeric in E11151 / R11151C5: '1'
## Warning: Coercing text to numeric in E11152 / R11152C5: '1'
## Warning: Coercing text to numeric in E11153 / R11153C5: '1'
## Warning: Coercing text to numeric in E11154 / R11154C5: '1'
## Warning: Coercing text to numeric in E11155 / R11155C5: '1'
## Warning: Coercing text to numeric in E11156 / R11156C5: '1'
## Warning: Coercing text to numeric in E11157 / R11157C5: '1'
## Warning: Coercing text to numeric in E11158 / R11158C5: '1'
## Warning: Coercing text to numeric in E11159 / R11159C5: '1'
## Warning: Coercing text to numeric in E11160 / R11160C5: '1'
## Warning: Coercing text to numeric in E11161 / R11161C5: '1'
## Warning: Coercing text to numeric in E11162 / R11162C5: '2'
## Warning: Coercing text to numeric in E11163 / R11163C5: '2'
## Warning: Coercing text to numeric in E11164 / R11164C5: '2'
## Warning: Coercing text to numeric in E11165 / R11165C5: '2'
## Warning: Coercing text to numeric in E11166 / R11166C5: '2'
## Warning: Coercing text to numeric in E11167 / R11167C5: '2'
## Warning: Coercing text to numeric in E11168 / R11168C5: '2'
## Warning: Coercing text to numeric in E11169 / R11169C5: '2'
## Warning: Coercing text to numeric in E11170 / R11170C5: '2'
## Warning: Coercing text to numeric in E11171 / R11171C5: '2'
## Warning: Coercing text to numeric in E11172 / R11172C5: '2'
## Warning: Coercing text to numeric in E11173 / R11173C5: '2'
## Warning: Coercing text to numeric in E11174 / R11174C5: '2'
## Warning: Coercing text to numeric in E11175 / R11175C5: '2'
## Warning: Coercing text to numeric in E11176 / R11176C5: '2'
## Warning: Coercing text to numeric in E11177 / R11177C5: '2'
## Warning: Coercing text to numeric in E11178 / R11178C5: '2'
## Warning: Coercing text to numeric in E11179 / R11179C5: '2'
## Warning: Coercing text to numeric in E11180 / R11180C5: '2'
## Warning: Coercing text to numeric in E11181 / R11181C5: '2'
## Warning: Coercing text to numeric in E11182 / R11182C5: '2'
## Warning: Coercing text to numeric in E11183 / R11183C5: '2'
## Warning: Coercing text to numeric in E11184 / R11184C5: '2'
## Warning: Coercing text to numeric in E11185 / R11185C5: '2'
## Warning: Coercing text to numeric in E11186 / R11186C5: '2'
## Warning: Coercing text to numeric in E11187 / R11187C5: '2'
## Warning: Coercing text to numeric in E11188 / R11188C5: '2'
## Warning: Coercing text to numeric in E11189 / R11189C5: '2'
## Warning: Coercing text to numeric in E11190 / R11190C5: '2'
## Warning: Coercing text to numeric in E11191 / R11191C5: '2'
## Warning: Coercing text to numeric in E11192 / R11192C5: '2'
## Warning: Coercing text to numeric in E11193 / R11193C5: '2'
## Warning: Coercing text to numeric in E11194 / R11194C5: '2'
## Warning: Coercing text to numeric in E11195 / R11195C5: '2'
## Warning: Coercing text to numeric in E11196 / R11196C5: '2'
## Warning: Coercing text to numeric in E11197 / R11197C5: '2'
## Warning: Coercing text to numeric in E11198 / R11198C5: '2'
## Warning: Coercing text to numeric in E11199 / R11199C5: '2'
## Warning: Coercing text to numeric in E11200 / R11200C5: '2'
## Warning: Coercing text to numeric in E11201 / R11201C5: '2'
## Warning: Coercing text to numeric in E11202 / R11202C5: '2'
## Warning: Coercing text to numeric in E11203 / R11203C5: '2'
## Warning: Coercing text to numeric in E11204 / R11204C5: '2'
## Warning: Coercing text to numeric in E11205 / R11205C5: '2'
## Warning: Coercing text to numeric in E11206 / R11206C5: '2'
## Warning: Coercing text to numeric in E11207 / R11207C5: '2'
## Warning: Coercing text to numeric in E11208 / R11208C5: '2'
## Warning: Coercing text to numeric in E11209 / R11209C5: '2'
## Warning: Coercing text to numeric in E11210 / R11210C5: '1'
## Warning: Coercing text to numeric in E11211 / R11211C5: '1'
## Warning: Coercing text to numeric in E11212 / R11212C5: '1'
## Warning: Coercing text to numeric in E11213 / R11213C5: '1'
## Warning: Coercing text to numeric in E11214 / R11214C5: '1'
## Warning: Coercing text to numeric in E11215 / R11215C5: '1'
## Warning: Coercing text to numeric in E11216 / R11216C5: '2'
## Warning: Coercing text to numeric in E11217 / R11217C5: '2'
## Warning: Coercing text to numeric in E11218 / R11218C5: '2'
## Warning: Coercing text to numeric in E11219 / R11219C5: '2'
## Warning: Coercing text to numeric in E11220 / R11220C5: '2'
## Warning: Coercing text to numeric in E11221 / R11221C5: '2'
## Warning: Coercing text to numeric in E11222 / R11222C5: '1'
## Warning: Coercing text to numeric in E11223 / R11223C5: '1'
## Warning: Coercing text to numeric in E11224 / R11224C5: '1'
## Warning: Coercing text to numeric in E11225 / R11225C5: '1'
## Warning: Coercing text to numeric in E11226 / R11226C5: '1'
## Warning: Coercing text to numeric in E11227 / R11227C5: '1'
## Warning: Coercing text to numeric in E11228 / R11228C5: '1'
## Warning: Coercing text to numeric in E11229 / R11229C5: '1'
## Warning: Coercing text to numeric in E11230 / R11230C5: '1'
## Warning: Coercing text to numeric in E11231 / R11231C5: '1'
## Warning: Coercing text to numeric in E11232 / R11232C5: '1'
## Warning: Coercing text to numeric in E11233 / R11233C5: '1'
## Warning: Coercing text to numeric in E11234 / R11234C5: '1'
## Warning: Coercing text to numeric in E11235 / R11235C5: '1'
## Warning: Coercing text to numeric in E11236 / R11236C5: '1'
## Warning: Coercing text to numeric in E11237 / R11237C5: '1'
## Warning: Coercing text to numeric in E11238 / R11238C5: '1'
## Warning: Coercing text to numeric in E11239 / R11239C5: '1'
## Warning: Coercing text to numeric in E11240 / R11240C5: '2'
## Warning: Coercing text to numeric in E11241 / R11241C5: '2'
## Warning: Coercing text to numeric in E11242 / R11242C5: '2'
## Warning: Coercing text to numeric in E11243 / R11243C5: '2'
## Warning: Coercing text to numeric in E11244 / R11244C5: '2'
## Warning: Coercing text to numeric in E11245 / R11245C5: '2'
## Warning: Coercing text to numeric in E11246 / R11246C5: '1'
## Warning: Coercing text to numeric in E11247 / R11247C5: '1'
## Warning: Coercing text to numeric in E11248 / R11248C5: '1'
## Warning: Coercing text to numeric in E11249 / R11249C5: '1'
## Warning: Coercing text to numeric in E11250 / R11250C5: '1'
## Warning: Coercing text to numeric in E11251 / R11251C5: '1'
## Warning: Coercing text to numeric in E11252 / R11252C5: '1'
## Warning: Coercing text to numeric in E11253 / R11253C5: '1'
## Warning: Coercing text to numeric in E11254 / R11254C5: '1'
## Warning: Coercing text to numeric in E11255 / R11255C5: '1'
## Warning: Coercing text to numeric in E11256 / R11256C5: '1'
## Warning: Coercing text to numeric in E11257 / R11257C5: '1'
## Warning: Coercing text to numeric in E11258 / R11258C5: '2'
## Warning: Coercing text to numeric in E11259 / R11259C5: '2'
## Warning: Coercing text to numeric in E11260 / R11260C5: '2'
## Warning: Coercing text to numeric in E11261 / R11261C5: '2'
## Warning: Coercing text to numeric in E11262 / R11262C5: '2'
## Warning: Coercing text to numeric in E11263 / R11263C5: '2'
## Warning: Coercing text to numeric in E11264 / R11264C5: '2'
## Warning: Coercing text to numeric in E11265 / R11265C5: '2'
## Warning: Coercing text to numeric in E11266 / R11266C5: '2'
## Warning: Coercing text to numeric in E11267 / R11267C5: '2'
## Warning: Coercing text to numeric in E11268 / R11268C5: '2'
## Warning: Coercing text to numeric in E11269 / R11269C5: '2'
## Warning: Coercing text to numeric in E11270 / R11270C5: '2'
## Warning: Coercing text to numeric in E11271 / R11271C5: '2'
## Warning: Coercing text to numeric in E11272 / R11272C5: '2'
## Warning: Coercing text to numeric in E11273 / R11273C5: '2'
## Warning: Coercing text to numeric in E11274 / R11274C5: '2'
## Warning: Coercing text to numeric in E11275 / R11275C5: '2'
## Warning: Coercing text to numeric in E11276 / R11276C5: '2'
## Warning: Coercing text to numeric in E11277 / R11277C5: '2'
## Warning: Coercing text to numeric in E11278 / R11278C5: '2'
## Warning: Coercing text to numeric in E11279 / R11279C5: '2'
## Warning: Coercing text to numeric in E11280 / R11280C5: '2'
## Warning: Coercing text to numeric in E11281 / R11281C5: '2'
## Warning: Coercing text to numeric in E11282 / R11282C5: '1'
## Warning: Coercing text to numeric in E11283 / R11283C5: '1'
## Warning: Coercing text to numeric in E11284 / R11284C5: '1'
## Warning: Coercing text to numeric in E11285 / R11285C5: '1'
## Warning: Coercing text to numeric in E11286 / R11286C5: '1'
## Warning: Coercing text to numeric in E11287 / R11287C5: '1'
## Warning: Coercing text to numeric in E11288 / R11288C5: '1'
## Warning: Coercing text to numeric in E11289 / R11289C5: '1'
## Warning: Coercing text to numeric in E11290 / R11290C5: '1'
## Warning: Coercing text to numeric in E11291 / R11291C5: '1'
## Warning: Coercing text to numeric in E11292 / R11292C5: '1'
## Warning: Coercing text to numeric in E11293 / R11293C5: '1'
## Warning: Coercing text to numeric in E11294 / R11294C5: '1'
## Warning: Coercing text to numeric in E11295 / R11295C5: '1'
## Warning: Coercing text to numeric in E11296 / R11296C5: '1'
## Warning: Coercing text to numeric in E11297 / R11297C5: '1'
## Warning: Coercing text to numeric in E11298 / R11298C5: '1'
## Warning: Coercing text to numeric in E11299 / R11299C5: '1'
## Warning: Coercing text to numeric in E11300 / R11300C5: '1'
## Warning: Coercing text to numeric in E11301 / R11301C5: '1'
## Warning: Coercing text to numeric in E11302 / R11302C5: '1'
## Warning: Coercing text to numeric in E11303 / R11303C5: '1'
## Warning: Coercing text to numeric in E11304 / R11304C5: '1'
## Warning: Coercing text to numeric in E11305 / R11305C5: '1'
## Warning: Coercing text to numeric in E11306 / R11306C5: '2'
## Warning: Coercing text to numeric in E11307 / R11307C5: '2'
## Warning: Coercing text to numeric in E11308 / R11308C5: '2'
## Warning: Coercing text to numeric in E11309 / R11309C5: '2'
## Warning: Coercing text to numeric in E11310 / R11310C5: '2'
## Warning: Coercing text to numeric in E11311 / R11311C5: '2'
## Warning: Coercing text to numeric in E11312 / R11312C5: '2'
## Warning: Coercing text to numeric in E11313 / R11313C5: '2'
## Warning: Coercing text to numeric in E11314 / R11314C5: '2'
## Warning: Coercing text to numeric in E11315 / R11315C5: '2'
## Warning: Coercing text to numeric in E11316 / R11316C5: '2'
## Warning: Coercing text to numeric in E11317 / R11317C5: '2'
## Warning: Coercing text to numeric in E11318 / R11318C5: '2'
## Warning: Coercing text to numeric in E11319 / R11319C5: '2'
## Warning: Coercing text to numeric in E11320 / R11320C5: '2'
## Warning: Coercing text to numeric in E11321 / R11321C5: '2'
## Warning: Coercing text to numeric in E11322 / R11322C5: '2'
## Warning: Coercing text to numeric in E11323 / R11323C5: '2'
## Warning: Coercing text to numeric in E11324 / R11324C5: '1'
## Warning: Coercing text to numeric in E11325 / R11325C5: '1'
## Warning: Coercing text to numeric in E11326 / R11326C5: '1'
## Warning: Coercing text to numeric in E11327 / R11327C5: '1'
## Warning: Coercing text to numeric in E11328 / R11328C5: '1'
## Warning: Coercing text to numeric in E11329 / R11329C5: '1'
## Warning: Coercing text to numeric in E11330 / R11330C5: '2'
## Warning: Coercing text to numeric in E11331 / R11331C5: '2'
## Warning: Coercing text to numeric in E11332 / R11332C5: '2'
## Warning: Coercing text to numeric in E11333 / R11333C5: '2'
## Warning: Coercing text to numeric in E11334 / R11334C5: '2'
## Warning: Coercing text to numeric in E11335 / R11335C5: '2'
## Warning: Coercing text to numeric in E11336 / R11336C5: '2'
## Warning: Coercing text to numeric in E11337 / R11337C5: '2'
## Warning: Coercing text to numeric in E11338 / R11338C5: '2'
## Warning: Coercing text to numeric in E11339 / R11339C5: '2'
## Warning: Coercing text to numeric in E11340 / R11340C5: '2'
## Warning: Coercing text to numeric in E11341 / R11341C5: '2'
## Warning: Coercing text to numeric in E11342 / R11342C5: '1'
## Warning: Coercing text to numeric in E11343 / R11343C5: '1'
## Warning: Coercing text to numeric in E11344 / R11344C5: '1'
## Warning: Coercing text to numeric in E11345 / R11345C5: '1'
## Warning: Coercing text to numeric in E11346 / R11346C5: '1'
## Warning: Coercing text to numeric in E11347 / R11347C5: '1'
## Warning: Coercing text to numeric in E11348 / R11348C5: '2'
## Warning: Coercing text to numeric in E11349 / R11349C5: '2'
## Warning: Coercing text to numeric in E11350 / R11350C5: '2'
## Warning: Coercing text to numeric in E11351 / R11351C5: '2'
## Warning: Coercing text to numeric in E11352 / R11352C5: '2'
## Warning: Coercing text to numeric in E11353 / R11353C5: '2'
## Warning: Coercing text to numeric in E11354 / R11354C5: '1'
## Warning: Coercing text to numeric in E11355 / R11355C5: '1'
## Warning: Coercing text to numeric in E11356 / R11356C5: '1'
## Warning: Coercing text to numeric in E11357 / R11357C5: '1'
## Warning: Coercing text to numeric in E11358 / R11358C5: '1'
## Warning: Coercing text to numeric in E11359 / R11359C5: '1'
## Warning: Coercing text to numeric in E11360 / R11360C5: '1'
## Warning: Coercing text to numeric in E11361 / R11361C5: '1'
## Warning: Coercing text to numeric in E11362 / R11362C5: '1'
## Warning: Coercing text to numeric in E11363 / R11363C5: '1'
## Warning: Coercing text to numeric in E11364 / R11364C5: '1'
## Warning: Coercing text to numeric in E11365 / R11365C5: '1'
## Warning: Coercing text to numeric in E11366 / R11366C5: '2'
## Warning: Coercing text to numeric in E11367 / R11367C5: '2'
## Warning: Coercing text to numeric in E11368 / R11368C5: '2'
## Warning: Coercing text to numeric in E11369 / R11369C5: '2'
## Warning: Coercing text to numeric in E11370 / R11370C5: '2'
## Warning: Coercing text to numeric in E11371 / R11371C5: '2'
## Warning: Coercing text to numeric in E11372 / R11372C5: '2'
## Warning: Coercing text to numeric in E11373 / R11373C5: '2'
## Warning: Coercing text to numeric in E11374 / R11374C5: '2'
## Warning: Coercing text to numeric in E11375 / R11375C5: '2'
## Warning: Coercing text to numeric in E11376 / R11376C5: '2'
## Warning: Coercing text to numeric in E11377 / R11377C5: '2'
## Warning: Coercing text to numeric in E11378 / R11378C5: '1'
## Warning: Coercing text to numeric in E11379 / R11379C5: '1'
## Warning: Coercing text to numeric in E11380 / R11380C5: '1'
## Warning: Coercing text to numeric in E11381 / R11381C5: '1'
## Warning: Coercing text to numeric in E11382 / R11382C5: '1'
## Warning: Coercing text to numeric in E11383 / R11383C5: '1'
## Warning: Coercing text to numeric in E11384 / R11384C5: '1'
## Warning: Coercing text to numeric in E11385 / R11385C5: '1'
## Warning: Coercing text to numeric in E11386 / R11386C5: '1'
## Warning: Coercing text to numeric in E11387 / R11387C5: '1'
## Warning: Coercing text to numeric in E11388 / R11388C5: '1'
## Warning: Coercing text to numeric in E11389 / R11389C5: '1'
## Warning: Coercing text to numeric in E11390 / R11390C5: '2'
## Warning: Coercing text to numeric in E11391 / R11391C5: '2'
## Warning: Coercing text to numeric in E11392 / R11392C5: '2'
## Warning: Coercing text to numeric in E11393 / R11393C5: '2'
## Warning: Coercing text to numeric in E11394 / R11394C5: '2'
## Warning: Coercing text to numeric in E11395 / R11395C5: '2'
## Warning: Coercing text to numeric in E11396 / R11396C5: '1'
## Warning: Coercing text to numeric in E11397 / R11397C5: '1'
## Warning: Coercing text to numeric in E11398 / R11398C5: '1'
## Warning: Coercing text to numeric in E11399 / R11399C5: '1'
## Warning: Coercing text to numeric in E11400 / R11400C5: '1'
## Warning: Coercing text to numeric in E11401 / R11401C5: '1'
## Warning: Coercing text to numeric in E11402 / R11402C5: '2'
## Warning: Coercing text to numeric in E11403 / R11403C5: '2'
## Warning: Coercing text to numeric in E11404 / R11404C5: '2'
## Warning: Coercing text to numeric in E11405 / R11405C5: '2'
## Warning: Coercing text to numeric in E11406 / R11406C5: '2'
## Warning: Coercing text to numeric in E11407 / R11407C5: '2'
## Warning: Coercing text to numeric in E11408 / R11408C5: '1'
## Warning: Coercing text to numeric in E11409 / R11409C5: '1'
## Warning: Coercing text to numeric in E11410 / R11410C5: '1'
## Warning: Coercing text to numeric in E11411 / R11411C5: '1'
## Warning: Coercing text to numeric in E11412 / R11412C5: '1'
## Warning: Coercing text to numeric in E11413 / R11413C5: '1'
## Warning: Coercing text to numeric in E11414 / R11414C5: '1'
## Warning: Coercing text to numeric in E11415 / R11415C5: '1'
## Warning: Coercing text to numeric in E11416 / R11416C5: '1'
## Warning: Coercing text to numeric in E11417 / R11417C5: '1'
## Warning: Coercing text to numeric in E11418 / R11418C5: '1'
## Warning: Coercing text to numeric in E11419 / R11419C5: '1'
## Warning: Coercing text to numeric in E11420 / R11420C5: '2'
## Warning: Coercing text to numeric in E11421 / R11421C5: '2'
## Warning: Coercing text to numeric in E11422 / R11422C5: '2'
## Warning: Coercing text to numeric in E11423 / R11423C5: '2'
## Warning: Coercing text to numeric in E11424 / R11424C5: '2'
## Warning: Coercing text to numeric in E11425 / R11425C5: '2'
## Warning: Coercing text to numeric in E11426 / R11426C5: '1'
## Warning: Coercing text to numeric in E11427 / R11427C5: '1'
## Warning: Coercing text to numeric in E11428 / R11428C5: '1'
## Warning: Coercing text to numeric in E11429 / R11429C5: '1'
## Warning: Coercing text to numeric in E11430 / R11430C5: '1'
## Warning: Coercing text to numeric in E11431 / R11431C5: '1'
## Warning: Coercing text to numeric in E11432 / R11432C5: '1'
## Warning: Coercing text to numeric in E11433 / R11433C5: '1'
## Warning: Coercing text to numeric in E11434 / R11434C5: '1'
## Warning: Coercing text to numeric in E11435 / R11435C5: '1'
## Warning: Coercing text to numeric in E11436 / R11436C5: '1'
## Warning: Coercing text to numeric in E11437 / R11437C5: '1'
## Warning: Coercing text to numeric in E11438 / R11438C5: '1'
## Warning: Coercing text to numeric in E11439 / R11439C5: '1'
## Warning: Coercing text to numeric in E11440 / R11440C5: '1'
## Warning: Coercing text to numeric in E11441 / R11441C5: '1'
## Warning: Coercing text to numeric in E11442 / R11442C5: '1'
## Warning: Coercing text to numeric in E11443 / R11443C5: '1'
## Warning: Coercing text to numeric in E11444 / R11444C5: '1'
## Warning: Coercing text to numeric in E11445 / R11445C5: '1'
## Warning: Coercing text to numeric in E11446 / R11446C5: '1'
## Warning: Coercing text to numeric in E11447 / R11447C5: '1'
## Warning: Coercing text to numeric in E11448 / R11448C5: '1'
## Warning: Coercing text to numeric in E11449 / R11449C5: '1'
## Warning: Coercing text to numeric in E11450 / R11450C5: '2'
## Warning: Coercing text to numeric in E11451 / R11451C5: '2'
## Warning: Coercing text to numeric in E11452 / R11452C5: '2'
## Warning: Coercing text to numeric in E11453 / R11453C5: '2'
## Warning: Coercing text to numeric in E11454 / R11454C5: '2'
## Warning: Coercing text to numeric in E11455 / R11455C5: '2'
## Warning: Coercing text to numeric in E11456 / R11456C5: '2'
## Warning: Coercing text to numeric in E11457 / R11457C5: '2'
## Warning: Coercing text to numeric in E11458 / R11458C5: '2'
## Warning: Coercing text to numeric in E11459 / R11459C5: '2'
## Warning: Coercing text to numeric in E11460 / R11460C5: '2'
## Warning: Coercing text to numeric in E11461 / R11461C5: '2'
## Warning: Coercing text to numeric in E11462 / R11462C5: '2'
## Warning: Coercing text to numeric in E11463 / R11463C5: '2'
## Warning: Coercing text to numeric in E11464 / R11464C5: '2'
## Warning: Coercing text to numeric in E11465 / R11465C5: '2'
## Warning: Coercing text to numeric in E11466 / R11466C5: '2'
## Warning: Coercing text to numeric in E11467 / R11467C5: '2'
## Warning: Coercing text to numeric in E11468 / R11468C5: '2'
## Warning: Coercing text to numeric in E11469 / R11469C5: '2'
## Warning: Coercing text to numeric in E11470 / R11470C5: '2'
## Warning: Coercing text to numeric in E11471 / R11471C5: '2'
## Warning: Coercing text to numeric in E11472 / R11472C5: '2'
## Warning: Coercing text to numeric in E11473 / R11473C5: '2'
## Warning: Coercing text to numeric in E11474 / R11474C5: '2'
## Warning: Coercing text to numeric in E11475 / R11475C5: '2'
## Warning: Coercing text to numeric in E11476 / R11476C5: '2'
## Warning: Coercing text to numeric in E11477 / R11477C5: '2'
## Warning: Coercing text to numeric in E11478 / R11478C5: '2'
## Warning: Coercing text to numeric in E11479 / R11479C5: '2'
## Warning: Coercing text to numeric in E11480 / R11480C5: '2'
## Warning: Coercing text to numeric in E11481 / R11481C5: '2'
## Warning: Coercing text to numeric in E11482 / R11482C5: '2'
## Warning: Coercing text to numeric in E11483 / R11483C5: '2'
## Warning: Coercing text to numeric in E11484 / R11484C5: '2'
## Warning: Coercing text to numeric in E11485 / R11485C5: '2'
## Warning: Coercing text to numeric in E11486 / R11486C5: '1'
## Warning: Coercing text to numeric in E11487 / R11487C5: '1'
## Warning: Coercing text to numeric in E11488 / R11488C5: '1'
## Warning: Coercing text to numeric in E11489 / R11489C5: '1'
## Warning: Coercing text to numeric in E11490 / R11490C5: '1'
## Warning: Coercing text to numeric in E11491 / R11491C5: '1'
## Warning: Coercing text to numeric in E11492 / R11492C5: '1'
## Warning: Coercing text to numeric in E11493 / R11493C5: '1'
## Warning: Coercing text to numeric in E11494 / R11494C5: '1'
## Warning: Coercing text to numeric in E11495 / R11495C5: '1'
## Warning: Coercing text to numeric in E11496 / R11496C5: '1'
## Warning: Coercing text to numeric in E11497 / R11497C5: '1'
## Warning: Coercing text to numeric in E11498 / R11498C5: '2'
## Warning: Coercing text to numeric in E11499 / R11499C5: '2'
## Warning: Coercing text to numeric in E11500 / R11500C5: '2'
## Warning: Coercing text to numeric in E11501 / R11501C5: '2'
## Warning: Coercing text to numeric in E11502 / R11502C5: '2'
## Warning: Coercing text to numeric in E11503 / R11503C5: '2'
## Warning: Coercing text to numeric in E11504 / R11504C5: '2'
## Warning: Coercing text to numeric in E11505 / R11505C5: '2'
## Warning: Coercing text to numeric in E11506 / R11506C5: '2'
## Warning: Coercing text to numeric in E11507 / R11507C5: '2'
## Warning: Coercing text to numeric in E11508 / R11508C5: '2'
## Warning: Coercing text to numeric in E11509 / R11509C5: '2'
## Warning: Coercing text to numeric in E11510 / R11510C5: '2'
## Warning: Coercing text to numeric in E11511 / R11511C5: '2'
## Warning: Coercing text to numeric in E11512 / R11512C5: '2'
## Warning: Coercing text to numeric in E11513 / R11513C5: '2'
## Warning: Coercing text to numeric in E11514 / R11514C5: '2'
## Warning: Coercing text to numeric in E11515 / R11515C5: '2'
## Warning: Coercing text to numeric in E11516 / R11516C5: '1'
## Warning: Coercing text to numeric in E11517 / R11517C5: '1'
## Warning: Coercing text to numeric in E11518 / R11518C5: '1'
## Warning: Coercing text to numeric in E11519 / R11519C5: '1'
## Warning: Coercing text to numeric in E11520 / R11520C5: '1'
## Warning: Coercing text to numeric in E11521 / R11521C5: '1'
## Warning: Coercing text to numeric in E11522 / R11522C5: '1'
## Warning: Coercing text to numeric in E11523 / R11523C5: '1'
## Warning: Coercing text to numeric in E11524 / R11524C5: '1'
## Warning: Coercing text to numeric in E11525 / R11525C5: '1'
## Warning: Coercing text to numeric in E11526 / R11526C5: '1'
## Warning: Coercing text to numeric in E11527 / R11527C5: '1'
## Warning: Coercing text to numeric in E11528 / R11528C5: '1'
## Warning: Coercing text to numeric in E11529 / R11529C5: '1'
## Warning: Coercing text to numeric in E11530 / R11530C5: '1'
## Warning: Coercing text to numeric in E11531 / R11531C5: '1'
## Warning: Coercing text to numeric in E11532 / R11532C5: '1'
## Warning: Coercing text to numeric in E11533 / R11533C5: '1'
## Warning: Coercing text to numeric in E11534 / R11534C5: '2'
## Warning: Coercing text to numeric in E11535 / R11535C5: '2'
## Warning: Coercing text to numeric in E11536 / R11536C5: '2'
## Warning: Coercing text to numeric in E11537 / R11537C5: '2'
## Warning: Coercing text to numeric in E11538 / R11538C5: '2'
## Warning: Coercing text to numeric in E11539 / R11539C5: '2'
## Warning: Coercing text to numeric in E11540 / R11540C5: '1'
## Warning: Coercing text to numeric in E11541 / R11541C5: '1'
## Warning: Coercing text to numeric in E11542 / R11542C5: '1'
## Warning: Coercing text to numeric in E11543 / R11543C5: '1'
## Warning: Coercing text to numeric in E11544 / R11544C5: '1'
## Warning: Coercing text to numeric in E11545 / R11545C5: '1'
## Warning: Coercing text to numeric in E11546 / R11546C5: '1'
## Warning: Coercing text to numeric in E11547 / R11547C5: '1'
## Warning: Coercing text to numeric in E11548 / R11548C5: '1'
## Warning: Coercing text to numeric in E11549 / R11549C5: '1'
## Warning: Coercing text to numeric in E11550 / R11550C5: '1'
## Warning: Coercing text to numeric in E11551 / R11551C5: '1'
## Warning: Coercing text to numeric in E11552 / R11552C5: '2'
## Warning: Coercing text to numeric in E11553 / R11553C5: '2'
## Warning: Coercing text to numeric in E11554 / R11554C5: '2'
## Warning: Coercing text to numeric in E11555 / R11555C5: '2'
## Warning: Coercing text to numeric in E11556 / R11556C5: '2'
## Warning: Coercing text to numeric in E11557 / R11557C5: '2'
## Warning: Coercing text to numeric in E11558 / R11558C5: '1'
## Warning: Coercing text to numeric in E11559 / R11559C5: '1'
## Warning: Coercing text to numeric in E11560 / R11560C5: '1'
## Warning: Coercing text to numeric in E11561 / R11561C5: '1'
## Warning: Coercing text to numeric in E11562 / R11562C5: '1'
## Warning: Coercing text to numeric in E11563 / R11563C5: '1'
## Warning: Coercing text to numeric in E11564 / R11564C5: '2'
## Warning: Coercing text to numeric in E11565 / R11565C5: '2'
## Warning: Coercing text to numeric in E11566 / R11566C5: '2'
## Warning: Coercing text to numeric in E11567 / R11567C5: '2'
## Warning: Coercing text to numeric in E11568 / R11568C5: '2'
## Warning: Coercing text to numeric in E11569 / R11569C5: '2'
## Warning: Coercing text to numeric in E11570 / R11570C5: '1'
## Warning: Coercing text to numeric in E11571 / R11571C5: '1'
## Warning: Coercing text to numeric in E11572 / R11572C5: '1'
## Warning: Coercing text to numeric in E11573 / R11573C5: '1'
## Warning: Coercing text to numeric in E11574 / R11574C5: '1'
## Warning: Coercing text to numeric in E11575 / R11575C5: '1'
## Warning: Coercing text to numeric in E11576 / R11576C5: '1'
## Warning: Coercing text to numeric in E11577 / R11577C5: '1'
## Warning: Coercing text to numeric in E11578 / R11578C5: '1'
## Warning: Coercing text to numeric in E11579 / R11579C5: '1'
## Warning: Coercing text to numeric in E11580 / R11580C5: '1'
## Warning: Coercing text to numeric in E11581 / R11581C5: '1'
## Warning: Coercing text to numeric in E11582 / R11582C5: '1'
## Warning: Coercing text to numeric in E11583 / R11583C5: '1'
## Warning: Coercing text to numeric in E11584 / R11584C5: '1'
## Warning: Coercing text to numeric in E11585 / R11585C5: '1'
## Warning: Coercing text to numeric in E11586 / R11586C5: '1'
## Warning: Coercing text to numeric in E11587 / R11587C5: '1'
## Warning: Coercing text to numeric in E11588 / R11588C5: '2'
## Warning: Coercing text to numeric in E11589 / R11589C5: '2'
## Warning: Coercing text to numeric in E11590 / R11590C5: '2'
## Warning: Coercing text to numeric in E11591 / R11591C5: '2'
## Warning: Coercing text to numeric in E11592 / R11592C5: '2'
## Warning: Coercing text to numeric in E11593 / R11593C5: '2'
## Warning: Coercing text to numeric in E11594 / R11594C5: '2'
## Warning: Coercing text to numeric in E11595 / R11595C5: '2'
## Warning: Coercing text to numeric in E11596 / R11596C5: '2'
## Warning: Coercing text to numeric in E11597 / R11597C5: '2'
## Warning: Coercing text to numeric in E11598 / R11598C5: '2'
## Warning: Coercing text to numeric in E11599 / R11599C5: '2'
## Warning: Coercing text to numeric in E11600 / R11600C5: '2'
## Warning: Coercing text to numeric in E11601 / R11601C5: '2'
## Warning: Coercing text to numeric in E11602 / R11602C5: '2'
## Warning: Coercing text to numeric in E11603 / R11603C5: '2'
## Warning: Coercing text to numeric in E11604 / R11604C5: '2'
## Warning: Coercing text to numeric in E11605 / R11605C5: '2'
## Warning: Coercing text to numeric in E11606 / R11606C5: '1'
## Warning: Coercing text to numeric in E11607 / R11607C5: '1'
## Warning: Coercing text to numeric in E11608 / R11608C5: '1'
## Warning: Coercing text to numeric in E11609 / R11609C5: '1'
## Warning: Coercing text to numeric in E11610 / R11610C5: '1'
## Warning: Coercing text to numeric in E11611 / R11611C5: '1'
## Warning: Coercing text to numeric in E11612 / R11612C5: '2'
## Warning: Coercing text to numeric in E11613 / R11613C5: '2'
## Warning: Coercing text to numeric in E11614 / R11614C5: '2'
## Warning: Coercing text to numeric in E11615 / R11615C5: '2'
## Warning: Coercing text to numeric in E11616 / R11616C5: '2'
## Warning: Coercing text to numeric in E11617 / R11617C5: '2'
## Warning: Coercing text to numeric in E11618 / R11618C5: '2'
## Warning: Coercing text to numeric in E11619 / R11619C5: '2'
## Warning: Coercing text to numeric in E11620 / R11620C5: '2'
## Warning: Coercing text to numeric in E11621 / R11621C5: '2'
## Warning: Coercing text to numeric in E11622 / R11622C5: '2'
## Warning: Coercing text to numeric in E11623 / R11623C5: '2'
## Warning: Coercing text to numeric in E11624 / R11624C5: '2'
## Warning: Coercing text to numeric in E11625 / R11625C5: '2'
## Warning: Coercing text to numeric in E11626 / R11626C5: '2'
## Warning: Coercing text to numeric in E11627 / R11627C5: '2'
## Warning: Coercing text to numeric in E11628 / R11628C5: '2'
## Warning: Coercing text to numeric in E11629 / R11629C5: '2'
## Warning: Coercing text to numeric in E11630 / R11630C5: '1'
## Warning: Coercing text to numeric in E11631 / R11631C5: '1'
## Warning: Coercing text to numeric in E11632 / R11632C5: '1'
## Warning: Coercing text to numeric in E11633 / R11633C5: '1'
## Warning: Coercing text to numeric in E11634 / R11634C5: '1'
## Warning: Coercing text to numeric in E11635 / R11635C5: '1'
## Warning: Coercing text to numeric in E11636 / R11636C5: '2'
## Warning: Coercing text to numeric in E11637 / R11637C5: '2'
## Warning: Coercing text to numeric in E11638 / R11638C5: '2'
## Warning: Coercing text to numeric in E11639 / R11639C5: '2'
## Warning: Coercing text to numeric in E11640 / R11640C5: '2'
## Warning: Coercing text to numeric in E11641 / R11641C5: '2'
## Warning: Coercing text to numeric in E11642 / R11642C5: '1'
## Warning: Coercing text to numeric in E11643 / R11643C5: '1'
## Warning: Coercing text to numeric in E11644 / R11644C5: '1'
## Warning: Coercing text to numeric in E11645 / R11645C5: '1'
## Warning: Coercing text to numeric in E11646 / R11646C5: '1'
## Warning: Coercing text to numeric in E11647 / R11647C5: '1'
## Warning: Coercing text to numeric in E11648 / R11648C5: '1'
## Warning: Coercing text to numeric in E11649 / R11649C5: '1'
## Warning: Coercing text to numeric in E11650 / R11650C5: '1'
## Warning: Coercing text to numeric in E11651 / R11651C5: '1'
## Warning: Coercing text to numeric in E11652 / R11652C5: '1'
## Warning: Coercing text to numeric in E11653 / R11653C5: '1'
## Warning: Coercing text to numeric in E11654 / R11654C5: '2'
## Warning: Coercing text to numeric in E11655 / R11655C5: '2'
## Warning: Coercing text to numeric in E11656 / R11656C5: '2'
## Warning: Coercing text to numeric in E11657 / R11657C5: '2'
## Warning: Coercing text to numeric in E11658 / R11658C5: '2'
## Warning: Coercing text to numeric in E11659 / R11659C5: '2'
## Warning: Coercing text to numeric in E11660 / R11660C5: '2'
## Warning: Coercing text to numeric in E11661 / R11661C5: '2'
## Warning: Coercing text to numeric in E11662 / R11662C5: '2'
## Warning: Coercing text to numeric in E11663 / R11663C5: '2'
## Warning: Coercing text to numeric in E11664 / R11664C5: '2'
## Warning: Coercing text to numeric in E11665 / R11665C5: '2'
## Warning: Coercing text to numeric in E11666 / R11666C5: '2'
## Warning: Coercing text to numeric in E11667 / R11667C5: '2'
## Warning: Coercing text to numeric in E11668 / R11668C5: '2'
## Warning: Coercing text to numeric in E11669 / R11669C5: '2'
## Warning: Coercing text to numeric in E11670 / R11670C5: '2'
## Warning: Coercing text to numeric in E11671 / R11671C5: '2'
## Warning: Coercing text to numeric in E11672 / R11672C5: '1'
## Warning: Coercing text to numeric in E11673 / R11673C5: '1'
## Warning: Coercing text to numeric in E11674 / R11674C5: '1'
## Warning: Coercing text to numeric in E11675 / R11675C5: '1'
## Warning: Coercing text to numeric in E11676 / R11676C5: '1'
## Warning: Coercing text to numeric in E11677 / R11677C5: '1'
## Warning: Coercing text to numeric in E11678 / R11678C5: '2'
## Warning: Coercing text to numeric in E11679 / R11679C5: '2'
## Warning: Coercing text to numeric in E11680 / R11680C5: '2'
## Warning: Coercing text to numeric in E11681 / R11681C5: '2'
## Warning: Coercing text to numeric in E11682 / R11682C5: '2'
## Warning: Coercing text to numeric in E11683 / R11683C5: '2'
## Warning: Coercing text to numeric in E11684 / R11684C5: '2'
## Warning: Coercing text to numeric in E11685 / R11685C5: '2'
## Warning: Coercing text to numeric in E11686 / R11686C5: '2'
## Warning: Coercing text to numeric in E11687 / R11687C5: '2'
## Warning: Coercing text to numeric in E11688 / R11688C5: '2'
## Warning: Coercing text to numeric in E11689 / R11689C5: '2'
## Warning: Coercing text to numeric in E11690 / R11690C5: '2'
## Warning: Coercing text to numeric in E11691 / R11691C5: '2'
## Warning: Coercing text to numeric in E11692 / R11692C5: '2'
## Warning: Coercing text to numeric in E11693 / R11693C5: '2'
## Warning: Coercing text to numeric in E11694 / R11694C5: '2'
## Warning: Coercing text to numeric in E11695 / R11695C5: '2'
## Warning: Coercing text to numeric in E11696 / R11696C5: '1'
## Warning: Coercing text to numeric in E11697 / R11697C5: '1'
## Warning: Coercing text to numeric in E11698 / R11698C5: '1'
## Warning: Coercing text to numeric in E11699 / R11699C5: '1'
## Warning: Coercing text to numeric in E11700 / R11700C5: '1'
## Warning: Coercing text to numeric in E11701 / R11701C5: '1'
## Warning: Coercing text to numeric in E11702 / R11702C5: '1'
## Warning: Coercing text to numeric in E11703 / R11703C5: '1'
## Warning: Coercing text to numeric in E11704 / R11704C5: '1'
## Warning: Coercing text to numeric in E11705 / R11705C5: '1'
## Warning: Coercing text to numeric in E11706 / R11706C5: '1'
## Warning: Coercing text to numeric in E11707 / R11707C5: '1'
## Warning: Coercing text to numeric in E11708 / R11708C5: '1'
## Warning: Coercing text to numeric in E11709 / R11709C5: '1'
## Warning: Coercing text to numeric in E11710 / R11710C5: '1'
## Warning: Coercing text to numeric in E11711 / R11711C5: '1'
## Warning: Coercing text to numeric in E11712 / R11712C5: '1'
## Warning: Coercing text to numeric in E11713 / R11713C5: '1'
## Warning: Coercing text to numeric in E11714 / R11714C5: '2'
## Warning: Coercing text to numeric in E11715 / R11715C5: '2'
## Warning: Coercing text to numeric in E11716 / R11716C5: '2'
## Warning: Coercing text to numeric in E11717 / R11717C5: '2'
## Warning: Coercing text to numeric in E11718 / R11718C5: '2'
## Warning: Coercing text to numeric in E11719 / R11719C5: '2'
## Warning: Coercing text to numeric in E11720 / R11720C5: '1'
## Warning: Coercing text to numeric in E11721 / R11721C5: '1'
## Warning: Coercing text to numeric in E11722 / R11722C5: '1'
## Warning: Coercing text to numeric in E11723 / R11723C5: '1'
## Warning: Coercing text to numeric in E11724 / R11724C5: '1'
## Warning: Coercing text to numeric in E11725 / R11725C5: '1'
## Warning: Coercing text to numeric in E11726 / R11726C5: '1'
## Warning: Coercing text to numeric in E11727 / R11727C5: '1'
## Warning: Coercing text to numeric in E11728 / R11728C5: '1'
## Warning: Coercing text to numeric in E11729 / R11729C5: '1'
## Warning: Coercing text to numeric in E11730 / R11730C5: '1'
## Warning: Coercing text to numeric in E11731 / R11731C5: '1'
## Warning: Coercing text to numeric in E11732 / R11732C5: '2'
## Warning: Coercing text to numeric in E11733 / R11733C5: '2'
## Warning: Coercing text to numeric in E11734 / R11734C5: '2'
## Warning: Coercing text to numeric in E11735 / R11735C5: '2'
## Warning: Coercing text to numeric in E11736 / R11736C5: '2'
## Warning: Coercing text to numeric in E11737 / R11737C5: '2'
## Warning: Coercing text to numeric in E11738 / R11738C5: '1'
## Warning: Coercing text to numeric in E11739 / R11739C5: '1'
## Warning: Coercing text to numeric in E11740 / R11740C5: '1'
## Warning: Coercing text to numeric in E11741 / R11741C5: '1'
## Warning: Coercing text to numeric in E11742 / R11742C5: '1'
## Warning: Coercing text to numeric in E11743 / R11743C5: '1'
## Warning: Coercing text to numeric in E11744 / R11744C5: '2'
## Warning: Coercing text to numeric in E11745 / R11745C5: '2'
## Warning: Coercing text to numeric in E11746 / R11746C5: '2'
## Warning: Coercing text to numeric in E11747 / R11747C5: '2'
## Warning: Coercing text to numeric in E11748 / R11748C5: '2'
## Warning: Coercing text to numeric in E11749 / R11749C5: '2'
## Warning: Coercing text to numeric in E11750 / R11750C5: '1'
## Warning: Coercing text to numeric in E11751 / R11751C5: '1'
## Warning: Coercing text to numeric in E11752 / R11752C5: '1'
## Warning: Coercing text to numeric in E11753 / R11753C5: '1'
## Warning: Coercing text to numeric in E11754 / R11754C5: '1'
## Warning: Coercing text to numeric in E11755 / R11755C5: '1'
## Warning: Coercing text to numeric in E11756 / R11756C5: '1'
## Warning: Coercing text to numeric in E11757 / R11757C5: '1'
## Warning: Coercing text to numeric in E11758 / R11758C5: '1'
## Warning: Coercing text to numeric in E11759 / R11759C5: '1'
## Warning: Coercing text to numeric in E11760 / R11760C5: '1'
## Warning: Coercing text to numeric in E11761 / R11761C5: '1'
## Warning: Coercing text to numeric in E11762 / R11762C5: '1'
## Warning: Coercing text to numeric in E11763 / R11763C5: '1'
## Warning: Coercing text to numeric in E11764 / R11764C5: '1'
## Warning: Coercing text to numeric in E11765 / R11765C5: '1'
## Warning: Coercing text to numeric in E11766 / R11766C5: '1'
## Warning: Coercing text to numeric in E11767 / R11767C5: '1'
## Warning: Coercing text to numeric in E11768 / R11768C5: '2'
## Warning: Coercing text to numeric in E11769 / R11769C5: '2'
## Warning: Coercing text to numeric in E11770 / R11770C5: '2'
## Warning: Coercing text to numeric in E11771 / R11771C5: '2'
## Warning: Coercing text to numeric in E11772 / R11772C5: '2'
## Warning: Coercing text to numeric in E11773 / R11773C5: '2'
## Warning: Coercing text to numeric in E11774 / R11774C5: '2'
## Warning: Coercing text to numeric in E11775 / R11775C5: '2'
## Warning: Coercing text to numeric in E11776 / R11776C5: '2'
## Warning: Coercing text to numeric in E11777 / R11777C5: '2'
## Warning: Coercing text to numeric in E11778 / R11778C5: '2'
## Warning: Coercing text to numeric in E11779 / R11779C5: '2'
## Warning: Coercing text to numeric in E11780 / R11780C5: '2'
## Warning: Coercing text to numeric in E11781 / R11781C5: '2'
## Warning: Coercing text to numeric in E11782 / R11782C5: '2'
## Warning: Coercing text to numeric in E11783 / R11783C5: '2'
## Warning: Coercing text to numeric in E11784 / R11784C5: '2'
## Warning: Coercing text to numeric in E11785 / R11785C5: '2'
## Warning: Coercing text to numeric in E11786 / R11786C5: '2'
## Warning: Coercing text to numeric in E11787 / R11787C5: '2'
## Warning: Coercing text to numeric in E11788 / R11788C5: '2'
## Warning: Coercing text to numeric in E11789 / R11789C5: '2'
## Warning: Coercing text to numeric in E11790 / R11790C5: '2'
## Warning: Coercing text to numeric in E11791 / R11791C5: '2'
## Warning: Coercing text to numeric in E11792 / R11792C5: '1'
## Warning: Coercing text to numeric in E11793 / R11793C5: '1'
## Warning: Coercing text to numeric in E11794 / R11794C5: '1'
## Warning: Coercing text to numeric in E11795 / R11795C5: '1'
## Warning: Coercing text to numeric in E11796 / R11796C5: '1'
## Warning: Coercing text to numeric in E11797 / R11797C5: '1'
## Warning: Coercing text to numeric in E11798 / R11798C5: '2'
## Warning: Coercing text to numeric in E11799 / R11799C5: '2'
## Warning: Coercing text to numeric in E11800 / R11800C5: '2'
## Warning: Coercing text to numeric in E11801 / R11801C5: '2'
## Warning: Coercing text to numeric in E11802 / R11802C5: '2'
## Warning: Coercing text to numeric in E11803 / R11803C5: '2'
## Warning: Coercing text to numeric in E11804 / R11804C5: '2'
## Warning: Coercing text to numeric in E11805 / R11805C5: '2'
## Warning: Coercing text to numeric in E11806 / R11806C5: '2'
## Warning: Coercing text to numeric in E11807 / R11807C5: '2'
## Warning: Coercing text to numeric in E11808 / R11808C5: '2'
## Warning: Coercing text to numeric in E11809 / R11809C5: '2'
## Warning: Coercing text to numeric in E11810 / R11810C5: '1'
## Warning: Coercing text to numeric in E11811 / R11811C5: '1'
## Warning: Coercing text to numeric in E11812 / R11812C5: '1'
## Warning: Coercing text to numeric in E11813 / R11813C5: '1'
## Warning: Coercing text to numeric in E11814 / R11814C5: '1'
## Warning: Coercing text to numeric in E11815 / R11815C5: '1'
## Warning: Coercing text to numeric in E11816 / R11816C5: '2'
## Warning: Coercing text to numeric in E11817 / R11817C5: '2'
## Warning: Coercing text to numeric in E11818 / R11818C5: '2'
## Warning: Coercing text to numeric in E11819 / R11819C5: '2'
## Warning: Coercing text to numeric in E11820 / R11820C5: '2'
## Warning: Coercing text to numeric in E11821 / R11821C5: '2'
## Warning: Coercing text to numeric in E11822 / R11822C5: '1'
## Warning: Coercing text to numeric in E11823 / R11823C5: '1'
## Warning: Coercing text to numeric in E11824 / R11824C5: '1'
## Warning: Coercing text to numeric in E11825 / R11825C5: '1'
## Warning: Coercing text to numeric in E11826 / R11826C5: '1'
## Warning: Coercing text to numeric in E11827 / R11827C5: '1'
## Warning: Coercing text to numeric in E11828 / R11828C5: '1'
## Warning: Coercing text to numeric in E11829 / R11829C5: '1'
## Warning: Coercing text to numeric in E11830 / R11830C5: '1'
## Warning: Coercing text to numeric in E11831 / R11831C5: '1'
## Warning: Coercing text to numeric in E11832 / R11832C5: '1'
## Warning: Coercing text to numeric in E11833 / R11833C5: '1'
## Warning: Coercing text to numeric in E11834 / R11834C5: '1'
## Warning: Coercing text to numeric in E11835 / R11835C5: '1'
## Warning: Coercing text to numeric in E11836 / R11836C5: '1'
## Warning: Coercing text to numeric in E11837 / R11837C5: '1'
## Warning: Coercing text to numeric in E11838 / R11838C5: '1'
## Warning: Coercing text to numeric in E11839 / R11839C5: '1'
## Warning: Coercing text to numeric in E11840 / R11840C5: '2'
## Warning: Coercing text to numeric in E11841 / R11841C5: '2'
## Warning: Coercing text to numeric in E11842 / R11842C5: '2'
## Warning: Coercing text to numeric in E11843 / R11843C5: '2'
## Warning: Coercing text to numeric in E11844 / R11844C5: '2'
## Warning: Coercing text to numeric in E11845 / R11845C5: '2'
## Warning: Coercing text to numeric in E11846 / R11846C5: '2'
## Warning: Coercing text to numeric in E11847 / R11847C5: '2'
## Warning: Coercing text to numeric in E11848 / R11848C5: '2'
## Warning: Coercing text to numeric in E11849 / R11849C5: '2'
## Warning: Coercing text to numeric in E11850 / R11850C5: '2'
## Warning: Coercing text to numeric in E11851 / R11851C5: '2'
## Warning: Coercing text to numeric in E11852 / R11852C5: '2'
## Warning: Coercing text to numeric in E11853 / R11853C5: '2'
## Warning: Coercing text to numeric in E11854 / R11854C5: '2'
## Warning: Coercing text to numeric in E11855 / R11855C5: '2'
## Warning: Coercing text to numeric in E11856 / R11856C5: '2'
## Warning: Coercing text to numeric in E11857 / R11857C5: '2'
## Warning: Coercing text to numeric in E11858 / R11858C5: '1'
## Warning: Coercing text to numeric in E11859 / R11859C5: '1'
## Warning: Coercing text to numeric in E11860 / R11860C5: '1'
## Warning: Coercing text to numeric in E11861 / R11861C5: '1'
## Warning: Coercing text to numeric in E11862 / R11862C5: '1'
## Warning: Coercing text to numeric in E11863 / R11863C5: '1'
## Warning: Coercing text to numeric in E11864 / R11864C5: '1'
## Warning: Coercing text to numeric in E11865 / R11865C5: '1'
## Warning: Coercing text to numeric in E11866 / R11866C5: '1'
## Warning: Coercing text to numeric in E11867 / R11867C5: '1'
## Warning: Coercing text to numeric in E11868 / R11868C5: '1'
## Warning: Coercing text to numeric in E11869 / R11869C5: '1'
## Warning: Coercing text to numeric in E11870 / R11870C5: '1'
## Warning: Coercing text to numeric in E11871 / R11871C5: '1'
## Warning: Coercing text to numeric in E11872 / R11872C5: '1'
## Warning: Coercing text to numeric in E11873 / R11873C5: '1'
## Warning: Coercing text to numeric in E11874 / R11874C5: '1'
## Warning: Coercing text to numeric in E11875 / R11875C5: '1'
## Warning: Coercing text to numeric in E11876 / R11876C5: '2'
## Warning: Coercing text to numeric in E11877 / R11877C5: '2'
## Warning: Coercing text to numeric in E11878 / R11878C5: '2'
## Warning: Coercing text to numeric in E11879 / R11879C5: '2'
## Warning: Coercing text to numeric in E11880 / R11880C5: '2'
## Warning: Coercing text to numeric in E11881 / R11881C5: '2'
## Warning: Coercing text to numeric in E11882 / R11882C5: '1'
## Warning: Coercing text to numeric in E11883 / R11883C5: '1'
## Warning: Coercing text to numeric in E11884 / R11884C5: '1'
## Warning: Coercing text to numeric in E11885 / R11885C5: '1'
## Warning: Coercing text to numeric in E11886 / R11886C5: '1'
## Warning: Coercing text to numeric in E11887 / R11887C5: '1'
## Warning: Coercing text to numeric in E11888 / R11888C5: '1'
## Warning: Coercing text to numeric in E11889 / R11889C5: '1'
## Warning: Coercing text to numeric in E11890 / R11890C5: '1'
## Warning: Coercing text to numeric in E11891 / R11891C5: '1'
## Warning: Coercing text to numeric in E11892 / R11892C5: '1'
## Warning: Coercing text to numeric in E11893 / R11893C5: '1'
## Warning: Coercing text to numeric in E11894 / R11894C5: '1'
## Warning: Coercing text to numeric in E11895 / R11895C5: '1'
## Warning: Coercing text to numeric in E11896 / R11896C5: '1'
## Warning: Coercing text to numeric in E11897 / R11897C5: '1'
## Warning: Coercing text to numeric in E11898 / R11898C5: '1'
## Warning: Coercing text to numeric in E11899 / R11899C5: '1'
## Warning: Coercing text to numeric in E11900 / R11900C5: '2'
## Warning: Coercing text to numeric in E11901 / R11901C5: '2'
## Warning: Coercing text to numeric in E11902 / R11902C5: '2'
## Warning: Coercing text to numeric in E11903 / R11903C5: '2'
## Warning: Coercing text to numeric in E11904 / R11904C5: '2'
## Warning: Coercing text to numeric in E11905 / R11905C5: '2'
## Warning: Coercing text to numeric in E11906 / R11906C5: '2'
## Warning: Coercing text to numeric in E11907 / R11907C5: '2'
## Warning: Coercing text to numeric in E11908 / R11908C5: '2'
## Warning: Coercing text to numeric in E11909 / R11909C5: '2'
## Warning: Coercing text to numeric in E11910 / R11910C5: '2'
## Warning: Coercing text to numeric in E11911 / R11911C5: '2'
## Warning: Coercing text to numeric in E11912 / R11912C5: '2'
## Warning: Coercing text to numeric in E11913 / R11913C5: '2'
## Warning: Coercing text to numeric in E11914 / R11914C5: '2'
## Warning: Coercing text to numeric in E11915 / R11915C5: '2'
## Warning: Coercing text to numeric in E11916 / R11916C5: '2'
## Warning: Coercing text to numeric in E11917 / R11917C5: '2'
## Warning: Coercing text to numeric in E11918 / R11918C5: '2'
## Warning: Coercing text to numeric in E11919 / R11919C5: '2'
## Warning: Coercing text to numeric in E11920 / R11920C5: '2'
## Warning: Coercing text to numeric in E11921 / R11921C5: '2'
## Warning: Coercing text to numeric in E11922 / R11922C5: '2'
## Warning: Coercing text to numeric in E11923 / R11923C5: '2'
## Warning: Coercing text to numeric in E11924 / R11924C5: '2'
## Warning: Coercing text to numeric in E11925 / R11925C5: '2'
## Warning: Coercing text to numeric in E11926 / R11926C5: '2'
## Warning: Coercing text to numeric in E11927 / R11927C5: '2'
## Warning: Coercing text to numeric in E11928 / R11928C5: '2'
## Warning: Coercing text to numeric in E11929 / R11929C5: '2'
## Warning: Coercing text to numeric in E11930 / R11930C5: '1'
## Warning: Coercing text to numeric in E11931 / R11931C5: '1'
## Warning: Coercing text to numeric in E11932 / R11932C5: '1'
## Warning: Coercing text to numeric in E11933 / R11933C5: '1'
## Warning: Coercing text to numeric in E11934 / R11934C5: '1'
## Warning: Coercing text to numeric in E11935 / R11935C5: '1'
## Warning: Coercing text to numeric in E11936 / R11936C5: '1'
## Warning: Coercing text to numeric in E11937 / R11937C5: '1'
## Warning: Coercing text to numeric in E11938 / R11938C5: '1'
## Warning: Coercing text to numeric in E11939 / R11939C5: '1'
## Warning: Coercing text to numeric in E11940 / R11940C5: '1'
## Warning: Coercing text to numeric in E11941 / R11941C5: '1'
## Warning: Coercing text to numeric in E11942 / R11942C5: '2'
## Warning: Coercing text to numeric in E11943 / R11943C5: '2'
## Warning: Coercing text to numeric in E11944 / R11944C5: '2'
## Warning: Coercing text to numeric in E11945 / R11945C5: '2'
## Warning: Coercing text to numeric in E11946 / R11946C5: '2'
## Warning: Coercing text to numeric in E11947 / R11947C5: '2'
## Warning: Coercing text to numeric in E11948 / R11948C5: '2'
## Warning: Coercing text to numeric in E11949 / R11949C5: '2'
## Warning: Coercing text to numeric in E11950 / R11950C5: '2'
## Warning: Coercing text to numeric in E11951 / R11951C5: '2'
## Warning: Coercing text to numeric in E11952 / R11952C5: '2'
## Warning: Coercing text to numeric in E11953 / R11953C5: '2'
## Warning: Coercing text to numeric in E11954 / R11954C5: '1'
## Warning: Coercing text to numeric in E11955 / R11955C5: '1'
## Warning: Coercing text to numeric in E11956 / R11956C5: '1'
## Warning: Coercing text to numeric in E11957 / R11957C5: '1'
## Warning: Coercing text to numeric in E11958 / R11958C5: '1'
## Warning: Coercing text to numeric in E11959 / R11959C5: '1'
## Warning: Coercing text to numeric in E11960 / R11960C5: '2'
## Warning: Coercing text to numeric in E11961 / R11961C5: '2'
## Warning: Coercing text to numeric in E11962 / R11962C5: '2'
## Warning: Coercing text to numeric in E11963 / R11963C5: '2'
## Warning: Coercing text to numeric in E11964 / R11964C5: '2'
## Warning: Coercing text to numeric in E11965 / R11965C5: '2'
## Warning: Coercing text to numeric in E11966 / R11966C5: '2'
## Warning: Coercing text to numeric in E11967 / R11967C5: '2'
## Warning: Coercing text to numeric in E11968 / R11968C5: '2'
## Warning: Coercing text to numeric in E11969 / R11969C5: '2'
## Warning: Coercing text to numeric in E11970 / R11970C5: '2'
## Warning: Coercing text to numeric in E11971 / R11971C5: '2'
## Warning: Coercing text to numeric in E11972 / R11972C5: '1'
## Warning: Coercing text to numeric in E11973 / R11973C5: '1'
## Warning: Coercing text to numeric in E11974 / R11974C5: '1'
## Warning: Coercing text to numeric in E11975 / R11975C5: '1'
## Warning: Coercing text to numeric in E11976 / R11976C5: '1'
## Warning: Coercing text to numeric in E11977 / R11977C5: '1'
## Warning: Coercing text to numeric in E11978 / R11978C5: '1'
## Warning: Coercing text to numeric in E11979 / R11979C5: '1'
## Warning: Coercing text to numeric in E11980 / R11980C5: '1'
## Warning: Coercing text to numeric in E11981 / R11981C5: '1'
## Warning: Coercing text to numeric in E11982 / R11982C5: '1'
## Warning: Coercing text to numeric in E11983 / R11983C5: '1'
## Warning: Coercing text to numeric in E11984 / R11984C5: '1'
## Warning: Coercing text to numeric in E11985 / R11985C5: '1'
## Warning: Coercing text to numeric in E11986 / R11986C5: '1'
## Warning: Coercing text to numeric in E11987 / R11987C5: '1'
## Warning: Coercing text to numeric in E11988 / R11988C5: '1'
## Warning: Coercing text to numeric in E11989 / R11989C5: '1'
## Warning: Coercing text to numeric in E11990 / R11990C5: '2'
## Warning: Coercing text to numeric in E11991 / R11991C5: '2'
## Warning: Coercing text to numeric in E11992 / R11992C5: '2'
## Warning: Coercing text to numeric in E11993 / R11993C5: '2'
## Warning: Coercing text to numeric in E11994 / R11994C5: '2'
## Warning: Coercing text to numeric in E11995 / R11995C5: '2'
## Warning: Coercing text to numeric in E11996 / R11996C5: '1'
## Warning: Coercing text to numeric in E11997 / R11997C5: '1'
## Warning: Coercing text to numeric in E11998 / R11998C5: '1'
## Warning: Coercing text to numeric in E11999 / R11999C5: '1'
## Warning: Coercing text to numeric in E12000 / R12000C5: '1'
## Warning: Coercing text to numeric in E12001 / R12001C5: '1'
## Warning: Coercing text to numeric in E12002 / R12002C5: '1'
## Warning: Coercing text to numeric in E12003 / R12003C5: '1'
## Warning: Coercing text to numeric in E12004 / R12004C5: '1'
## Warning: Coercing text to numeric in E12005 / R12005C5: '1'
## Warning: Coercing text to numeric in E12006 / R12006C5: '1'
## Warning: Coercing text to numeric in E12007 / R12007C5: '1'
## Warning: Coercing text to numeric in E12008 / R12008C5: '2'
## Warning: Coercing text to numeric in E12009 / R12009C5: '2'
## Warning: Coercing text to numeric in E12010 / R12010C5: '2'
## Warning: Coercing text to numeric in E12011 / R12011C5: '2'
## Warning: Coercing text to numeric in E12012 / R12012C5: '2'
## Warning: Coercing text to numeric in E12013 / R12013C5: '2'
## Warning: Coercing text to numeric in E12014 / R12014C5: '1'
## Warning: Coercing text to numeric in E12015 / R12015C5: '1'
## Warning: Coercing text to numeric in E12016 / R12016C5: '1'
## Warning: Coercing text to numeric in E12017 / R12017C5: '1'
## Warning: Coercing text to numeric in E12018 / R12018C5: '1'
## Warning: Coercing text to numeric in E12019 / R12019C5: '1'
## Warning: Coercing text to numeric in E12020 / R12020C5: '2'
## Warning: Coercing text to numeric in E12021 / R12021C5: '2'
## Warning: Coercing text to numeric in E12022 / R12022C5: '2'
## Warning: Coercing text to numeric in E12023 / R12023C5: '2'
## Warning: Coercing text to numeric in E12024 / R12024C5: '2'
## Warning: Coercing text to numeric in E12025 / R12025C5: '2'
## Warning: Coercing text to numeric in E12026 / R12026C5: '2'
## Warning: Coercing text to numeric in E12027 / R12027C5: '2'
## Warning: Coercing text to numeric in E12028 / R12028C5: '2'
## Warning: Coercing text to numeric in E12029 / R12029C5: '2'
## Warning: Coercing text to numeric in E12030 / R12030C5: '2'
## Warning: Coercing text to numeric in E12031 / R12031C5: '2'
## Warning: Coercing text to numeric in E12032 / R12032C5: '2'
## Warning: Coercing text to numeric in E12033 / R12033C5: '2'
## Warning: Coercing text to numeric in E12034 / R12034C5: '2'
## Warning: Coercing text to numeric in E12035 / R12035C5: '2'
## Warning: Coercing text to numeric in E12036 / R12036C5: '2'
## Warning: Coercing text to numeric in E12037 / R12037C5: '2'
## Warning: Coercing text to numeric in E12038 / R12038C5: '2'
## Warning: Coercing text to numeric in E12039 / R12039C5: '2'
## Warning: Coercing text to numeric in E12040 / R12040C5: '2'
## Warning: Coercing text to numeric in E12041 / R12041C5: '2'
## Warning: Coercing text to numeric in E12042 / R12042C5: '2'
## Warning: Coercing text to numeric in E12043 / R12043C5: '2'
## Warning: Coercing text to numeric in E12044 / R12044C5: '1'
## Warning: Coercing text to numeric in E12045 / R12045C5: '1'
## Warning: Coercing text to numeric in E12046 / R12046C5: '1'
## Warning: Coercing text to numeric in E12047 / R12047C5: '1'
## Warning: Coercing text to numeric in E12048 / R12048C5: '1'
## Warning: Coercing text to numeric in E12049 / R12049C5: '1'
## Warning: Coercing text to numeric in E12050 / R12050C5: '1'
## Warning: Coercing text to numeric in E12051 / R12051C5: '1'
## Warning: Coercing text to numeric in E12052 / R12052C5: '1'
## Warning: Coercing text to numeric in E12053 / R12053C5: '1'
## Warning: Coercing text to numeric in E12054 / R12054C5: '1'
## Warning: Coercing text to numeric in E12055 / R12055C5: '1'
## Warning: Coercing text to numeric in E12056 / R12056C5: '2'
## Warning: Coercing text to numeric in E12057 / R12057C5: '2'
## Warning: Coercing text to numeric in E12058 / R12058C5: '2'
## Warning: Coercing text to numeric in E12059 / R12059C5: '2'
## Warning: Coercing text to numeric in E12060 / R12060C5: '2'
## Warning: Coercing text to numeric in E12061 / R12061C5: '2'
## Warning: Coercing text to numeric in E12062 / R12062C5: '1'
## Warning: Coercing text to numeric in E12063 / R12063C5: '1'
## Warning: Coercing text to numeric in E12064 / R12064C5: '1'
## Warning: Coercing text to numeric in E12065 / R12065C5: '1'
## Warning: Coercing text to numeric in E12066 / R12066C5: '1'
## Warning: Coercing text to numeric in E12067 / R12067C5: '1'
## Warning: Coercing text to numeric in E12068 / R12068C5: '2'
## Warning: Coercing text to numeric in E12069 / R12069C5: '2'
## Warning: Coercing text to numeric in E12070 / R12070C5: '2'
## Warning: Coercing text to numeric in E12071 / R12071C5: '2'
## Warning: Coercing text to numeric in E12072 / R12072C5: '2'
## Warning: Coercing text to numeric in E12073 / R12073C5: '2'
## Warning: Coercing text to numeric in E12074 / R12074C5: '1'
## Warning: Coercing text to numeric in E12075 / R12075C5: '1'
## Warning: Coercing text to numeric in E12076 / R12076C5: '1'
## Warning: Coercing text to numeric in E12077 / R12077C5: '1'
## Warning: Coercing text to numeric in E12078 / R12078C5: '1'
## Warning: Coercing text to numeric in E12079 / R12079C5: '1'
## Warning: Coercing text to numeric in E12080 / R12080C5: '2'
## Warning: Coercing text to numeric in E12081 / R12081C5: '2'
## Warning: Coercing text to numeric in E12082 / R12082C5: '2'
## Warning: Coercing text to numeric in E12083 / R12083C5: '2'
## Warning: Coercing text to numeric in E12084 / R12084C5: '2'
## Warning: Coercing text to numeric in E12085 / R12085C5: '2'
## Warning: Coercing text to numeric in E12086 / R12086C5: '1'
## Warning: Coercing text to numeric in E12087 / R12087C5: '1'
## Warning: Coercing text to numeric in E12088 / R12088C5: '1'
## Warning: Coercing text to numeric in E12089 / R12089C5: '1'
## Warning: Coercing text to numeric in E12090 / R12090C5: '1'
## Warning: Coercing text to numeric in E12091 / R12091C5: '1'
## Warning: Coercing text to numeric in E12092 / R12092C5: '1'
## Warning: Coercing text to numeric in E12093 / R12093C5: '1'
## Warning: Coercing text to numeric in E12094 / R12094C5: '1'
## Warning: Coercing text to numeric in E12095 / R12095C5: '1'
## Warning: Coercing text to numeric in E12096 / R12096C5: '1'
## Warning: Coercing text to numeric in E12097 / R12097C5: '1'
## Warning: Coercing text to numeric in E12098 / R12098C5: '1'
## Warning: Coercing text to numeric in E12099 / R12099C5: '1'
## Warning: Coercing text to numeric in E12100 / R12100C5: '1'
## Warning: Coercing text to numeric in E12101 / R12101C5: '1'
## Warning: Coercing text to numeric in E12102 / R12102C5: '1'
## Warning: Coercing text to numeric in E12103 / R12103C5: '1'
## Warning: Coercing text to numeric in E12104 / R12104C5: '2'
## Warning: Coercing text to numeric in E12105 / R12105C5: '2'
## Warning: Coercing text to numeric in E12106 / R12106C5: '2'
## Warning: Coercing text to numeric in E12107 / R12107C5: '2'
## Warning: Coercing text to numeric in E12108 / R12108C5: '2'
## Warning: Coercing text to numeric in E12109 / R12109C5: '2'
## Warning: Coercing text to numeric in E12110 / R12110C5: '2'
## Warning: Coercing text to numeric in E12111 / R12111C5: '2'
## Warning: Coercing text to numeric in E12112 / R12112C5: '2'
## Warning: Coercing text to numeric in E12113 / R12113C5: '2'
## Warning: Coercing text to numeric in E12114 / R12114C5: '2'
## Warning: Coercing text to numeric in E12115 / R12115C5: '2'
## Warning: Coercing text to numeric in E12116 / R12116C5: '2'
## Warning: Coercing text to numeric in E12117 / R12117C5: '2'
## Warning: Coercing text to numeric in E12118 / R12118C5: '2'
## Warning: Coercing text to numeric in E12119 / R12119C5: '2'
## Warning: Coercing text to numeric in E12120 / R12120C5: '2'
## Warning: Coercing text to numeric in E12121 / R12121C5: '2'
## Warning: Coercing text to numeric in E12122 / R12122C5: '1'
## Warning: Coercing text to numeric in E12123 / R12123C5: '1'
## Warning: Coercing text to numeric in E12124 / R12124C5: '1'
## Warning: Coercing text to numeric in E12125 / R12125C5: '1'
## Warning: Coercing text to numeric in E12126 / R12126C5: '1'
## Warning: Coercing text to numeric in E12127 / R12127C5: '1'
## Warning: Coercing text to numeric in E12128 / R12128C5: '1'
## Warning: Coercing text to numeric in E12129 / R12129C5: '1'
## Warning: Coercing text to numeric in E12130 / R12130C5: '1'
## Warning: Coercing text to numeric in E12131 / R12131C5: '1'
## Warning: Coercing text to numeric in E12132 / R12132C5: '1'
## Warning: Coercing text to numeric in E12133 / R12133C5: '1'
## Warning: Coercing text to numeric in E12134 / R12134C5: '1'
## Warning: Coercing text to numeric in E12135 / R12135C5: '1'
## Warning: Coercing text to numeric in E12136 / R12136C5: '1'
## Warning: Coercing text to numeric in E12137 / R12137C5: '1'
## Warning: Coercing text to numeric in E12138 / R12138C5: '1'
## Warning: Coercing text to numeric in E12139 / R12139C5: '1'
## Warning: Coercing text to numeric in E12140 / R12140C5: '1'
## Warning: Coercing text to numeric in E12141 / R12141C5: '1'
## Warning: Coercing text to numeric in E12142 / R12142C5: '1'
## Warning: Coercing text to numeric in E12143 / R12143C5: '1'
## Warning: Coercing text to numeric in E12144 / R12144C5: '1'
## Warning: Coercing text to numeric in E12145 / R12145C5: '1'
## Warning: Coercing text to numeric in E12146 / R12146C5: '2'
## Warning: Coercing text to numeric in E12147 / R12147C5: '2'
## Warning: Coercing text to numeric in E12148 / R12148C5: '2'
## Warning: Coercing text to numeric in E12149 / R12149C5: '2'
## Warning: Coercing text to numeric in E12150 / R12150C5: '2'
## Warning: Coercing text to numeric in E12151 / R12151C5: '2'
## Warning: Coercing text to numeric in E12152 / R12152C5: '2'
## Warning: Coercing text to numeric in E12153 / R12153C5: '2'
## Warning: Coercing text to numeric in E12154 / R12154C5: '2'
## Warning: Coercing text to numeric in E12155 / R12155C5: '2'
## Warning: Coercing text to numeric in E12156 / R12156C5: '2'
## Warning: Coercing text to numeric in E12157 / R12157C5: '2'
## Warning: Coercing text to numeric in E12158 / R12158C5: '1'
## Warning: Coercing text to numeric in E12159 / R12159C5: '1'
## Warning: Coercing text to numeric in E12160 / R12160C5: '1'
## Warning: Coercing text to numeric in E12161 / R12161C5: '1'
## Warning: Coercing text to numeric in E12162 / R12162C5: '1'
## Warning: Coercing text to numeric in E12163 / R12163C5: '1'
## Warning: Coercing text to numeric in E12164 / R12164C5: '2'
## Warning: Coercing text to numeric in E12165 / R12165C5: '2'
## Warning: Coercing text to numeric in E12166 / R12166C5: '2'
## Warning: Coercing text to numeric in E12167 / R12167C5: '2'
## Warning: Coercing text to numeric in E12168 / R12168C5: '2'
## Warning: Coercing text to numeric in E12169 / R12169C5: '2'
## Warning: Coercing text to numeric in E12170 / R12170C5: '2'
## Warning: Coercing text to numeric in E12171 / R12171C5: '2'
## Warning: Coercing text to numeric in E12172 / R12172C5: '2'
## Warning: Coercing text to numeric in E12173 / R12173C5: '2'
## Warning: Coercing text to numeric in E12174 / R12174C5: '2'
## Warning: Coercing text to numeric in E12175 / R12175C5: '2'
## Warning: Coercing text to numeric in E12176 / R12176C5: '2'
## Warning: Coercing text to numeric in E12177 / R12177C5: '2'
## Warning: Coercing text to numeric in E12178 / R12178C5: '2'
## Warning: Coercing text to numeric in E12179 / R12179C5: '2'
## Warning: Coercing text to numeric in E12180 / R12180C5: '2'
## Warning: Coercing text to numeric in E12181 / R12181C5: '2'
## Warning: Coercing text to numeric in E12182 / R12182C5: '2'
## Warning: Coercing text to numeric in E12183 / R12183C5: '2'
## Warning: Coercing text to numeric in E12184 / R12184C5: '2'
## Warning: Coercing text to numeric in E12185 / R12185C5: '2'
## Warning: Coercing text to numeric in E12186 / R12186C5: '2'
## Warning: Coercing text to numeric in E12187 / R12187C5: '2'
## Warning: Coercing text to numeric in E12188 / R12188C5: '1'
## Warning: Coercing text to numeric in E12189 / R12189C5: '1'
## Warning: Coercing text to numeric in E12190 / R12190C5: '1'
## Warning: Coercing text to numeric in E12191 / R12191C5: '1'
## Warning: Coercing text to numeric in E12192 / R12192C5: '1'
## Warning: Coercing text to numeric in E12193 / R12193C5: '1'
## Warning: Coercing text to numeric in E12194 / R12194C5: '1'
## Warning: Coercing text to numeric in E12195 / R12195C5: '1'
## Warning: Coercing text to numeric in E12196 / R12196C5: '1'
## Warning: Coercing text to numeric in E12197 / R12197C5: '1'
## Warning: Coercing text to numeric in E12198 / R12198C5: '1'
## Warning: Coercing text to numeric in E12199 / R12199C5: '1'
## Warning: Coercing text to numeric in E12200 / R12200C5: '2'
## Warning: Coercing text to numeric in E12201 / R12201C5: '2'
## Warning: Coercing text to numeric in E12202 / R12202C5: '2'
## Warning: Coercing text to numeric in E12203 / R12203C5: '2'
## Warning: Coercing text to numeric in E12204 / R12204C5: '2'
## Warning: Coercing text to numeric in E12205 / R12205C5: '2'
## Warning: Coercing text to numeric in E12206 / R12206C5: '1'
## Warning: Coercing text to numeric in E12207 / R12207C5: '1'
## Warning: Coercing text to numeric in E12208 / R12208C5: '1'
## Warning: Coercing text to numeric in E12209 / R12209C5: '1'
## Warning: Coercing text to numeric in E12210 / R12210C5: '1'
## Warning: Coercing text to numeric in E12211 / R12211C5: '1'
## Warning: Coercing text to numeric in E12212 / R12212C5: '2'
## Warning: Coercing text to numeric in E12213 / R12213C5: '2'
## Warning: Coercing text to numeric in E12214 / R12214C5: '2'
## Warning: Coercing text to numeric in E12215 / R12215C5: '2'
## Warning: Coercing text to numeric in E12216 / R12216C5: '2'
## Warning: Coercing text to numeric in E12217 / R12217C5: '2'
## Warning: Coercing text to numeric in E12218 / R12218C5: '1'
## Warning: Coercing text to numeric in E12219 / R12219C5: '1'
## Warning: Coercing text to numeric in E12220 / R12220C5: '1'
## Warning: Coercing text to numeric in E12221 / R12221C5: '1'
## Warning: Coercing text to numeric in E12222 / R12222C5: '1'
## Warning: Coercing text to numeric in E12223 / R12223C5: '1'
## Warning: Coercing text to numeric in E12224 / R12224C5: '2'
## Warning: Coercing text to numeric in E12225 / R12225C5: '2'
## Warning: Coercing text to numeric in E12226 / R12226C5: '2'
## Warning: Coercing text to numeric in E12227 / R12227C5: '2'
## Warning: Coercing text to numeric in E12228 / R12228C5: '2'
## Warning: Coercing text to numeric in E12229 / R12229C5: '2'
## Warning: Coercing text to numeric in E12230 / R12230C5: '2'
## Warning: Coercing text to numeric in E12231 / R12231C5: '2'
## Warning: Coercing text to numeric in E12232 / R12232C5: '2'
## Warning: Coercing text to numeric in E12233 / R12233C5: '2'
## Warning: Coercing text to numeric in E12234 / R12234C5: '2'
## Warning: Coercing text to numeric in E12235 / R12235C5: '2'
## Warning: Coercing text to numeric in E12236 / R12236C5: '1'
## Warning: Coercing text to numeric in E12237 / R12237C5: '1'
## Warning: Coercing text to numeric in E12238 / R12238C5: '1'
## Warning: Coercing text to numeric in E12239 / R12239C5: '1'
## Warning: Coercing text to numeric in E12240 / R12240C5: '1'
## Warning: Coercing text to numeric in E12241 / R12241C5: '1'
## Warning: Coercing text to numeric in E12242 / R12242C5: '1'
## Warning: Coercing text to numeric in E12243 / R12243C5: '1'
## Warning: Coercing text to numeric in E12244 / R12244C5: '1'
## Warning: Coercing text to numeric in E12245 / R12245C5: '1'
## Warning: Coercing text to numeric in E12246 / R12246C5: '1'
## Warning: Coercing text to numeric in E12247 / R12247C5: '1'
## Warning: Coercing text to numeric in E12248 / R12248C5: '2'
## Warning: Coercing text to numeric in E12249 / R12249C5: '2'
## Warning: Coercing text to numeric in E12250 / R12250C5: '2'
## Warning: Coercing text to numeric in E12251 / R12251C5: '2'
## Warning: Coercing text to numeric in E12252 / R12252C5: '2'
## Warning: Coercing text to numeric in E12253 / R12253C5: '2'
## Warning: Coercing text to numeric in E12254 / R12254C5: '1'
## Warning: Coercing text to numeric in E12255 / R12255C5: '1'
## Warning: Coercing text to numeric in E12256 / R12256C5: '1'
## Warning: Coercing text to numeric in E12257 / R12257C5: '1'
## Warning: Coercing text to numeric in E12258 / R12258C5: '1'
## Warning: Coercing text to numeric in E12259 / R12259C5: '1'
## Warning: Coercing text to numeric in E12260 / R12260C5: '1'
## Warning: Coercing text to numeric in E12261 / R12261C5: '1'
## Warning: Coercing text to numeric in E12262 / R12262C5: '1'
## Warning: Coercing text to numeric in E12263 / R12263C5: '1'
## Warning: Coercing text to numeric in E12264 / R12264C5: '1'
## Warning: Coercing text to numeric in E12265 / R12265C5: '1'
## Warning: Coercing text to numeric in E12266 / R12266C5: '1'
## Warning: Coercing text to numeric in E12267 / R12267C5: '1'
## Warning: Coercing text to numeric in E12268 / R12268C5: '1'
## Warning: Coercing text to numeric in E12269 / R12269C5: '1'
## Warning: Coercing text to numeric in E12270 / R12270C5: '1'
## Warning: Coercing text to numeric in E12271 / R12271C5: '1'
## Warning: Coercing text to numeric in E12272 / R12272C5: '2'
## Warning: Coercing text to numeric in E12273 / R12273C5: '2'
## Warning: Coercing text to numeric in E12274 / R12274C5: '2'
## Warning: Coercing text to numeric in E12275 / R12275C5: '2'
## Warning: Coercing text to numeric in E12276 / R12276C5: '2'
## Warning: Coercing text to numeric in E12277 / R12277C5: '2'
## Warning: Coercing text to numeric in E12278 / R12278C5: '1'
## Warning: Coercing text to numeric in E12279 / R12279C5: '1'
## Warning: Coercing text to numeric in E12280 / R12280C5: '1'
## Warning: Coercing text to numeric in E12281 / R12281C5: '1'
## Warning: Coercing text to numeric in E12282 / R12282C5: '1'
## Warning: Coercing text to numeric in E12283 / R12283C5: '1'
## Warning: Coercing text to numeric in E12284 / R12284C5: '1'
## Warning: Coercing text to numeric in E12285 / R12285C5: '1'
## Warning: Coercing text to numeric in E12286 / R12286C5: '1'
## Warning: Coercing text to numeric in E12287 / R12287C5: '1'
## Warning: Coercing text to numeric in E12288 / R12288C5: '1'
## Warning: Coercing text to numeric in E12289 / R12289C5: '1'
## Warning: Coercing text to numeric in E12290 / R12290C5: '2'
## Warning: Coercing text to numeric in E12291 / R12291C5: '2'
## Warning: Coercing text to numeric in E12292 / R12292C5: '2'
## Warning: Coercing text to numeric in E12293 / R12293C5: '2'
## Warning: Coercing text to numeric in E12294 / R12294C5: '2'
## Warning: Coercing text to numeric in E12295 / R12295C5: '2'
## Warning: Coercing text to numeric in E12296 / R12296C5: '2'
## Warning: Coercing text to numeric in E12297 / R12297C5: '2'
## Warning: Coercing text to numeric in E12298 / R12298C5: '2'
## Warning: Coercing text to numeric in E12299 / R12299C5: '2'
## Warning: Coercing text to numeric in E12300 / R12300C5: '2'
## Warning: Coercing text to numeric in E12301 / R12301C5: '2'
## Warning: Coercing text to numeric in E12302 / R12302C5: '2'
## Warning: Coercing text to numeric in E12303 / R12303C5: '2'
## Warning: Coercing text to numeric in E12304 / R12304C5: '2'
## Warning: Coercing text to numeric in E12305 / R12305C5: '2'
## Warning: Coercing text to numeric in E12306 / R12306C5: '2'
## Warning: Coercing text to numeric in E12307 / R12307C5: '2'
## Warning: Coercing text to numeric in E12308 / R12308C5: '2'
## Warning: Coercing text to numeric in E12309 / R12309C5: '2'
## Warning: Coercing text to numeric in E12310 / R12310C5: '2'
## Warning: Coercing text to numeric in E12311 / R12311C5: '2'
## Warning: Coercing text to numeric in E12312 / R12312C5: '2'
## Warning: Coercing text to numeric in E12313 / R12313C5: '2'
## Warning: Coercing text to numeric in E12314 / R12314C5: '2'
## Warning: Coercing text to numeric in E12315 / R12315C5: '2'
## Warning: Coercing text to numeric in E12316 / R12316C5: '2'
## Warning: Coercing text to numeric in E12317 / R12317C5: '2'
## Warning: Coercing text to numeric in E12318 / R12318C5: '2'
## Warning: Coercing text to numeric in E12319 / R12319C5: '2'
## Warning: Coercing text to numeric in E12320 / R12320C5: '2'
## Warning: Coercing text to numeric in E12321 / R12321C5: '2'
## Warning: Coercing text to numeric in E12322 / R12322C5: '2'
## Warning: Coercing text to numeric in E12323 / R12323C5: '2'
## Warning: Coercing text to numeric in E12324 / R12324C5: '2'
## Warning: Coercing text to numeric in E12325 / R12325C5: '2'
## Warning: Coercing text to numeric in E12326 / R12326C5: '2'
## Warning: Coercing text to numeric in E12327 / R12327C5: '2'
## Warning: Coercing text to numeric in E12328 / R12328C5: '2'
## Warning: Coercing text to numeric in E12329 / R12329C5: '2'
## Warning: Coercing text to numeric in E12330 / R12330C5: '2'
## Warning: Coercing text to numeric in E12331 / R12331C5: '2'
## Warning: Coercing text to numeric in E12332 / R12332C5: '1'
## Warning: Coercing text to numeric in E12333 / R12333C5: '1'
## Warning: Coercing text to numeric in E12334 / R12334C5: '1'
## Warning: Coercing text to numeric in E12335 / R12335C5: '1'
## Warning: Coercing text to numeric in E12336 / R12336C5: '1'
## Warning: Coercing text to numeric in E12337 / R12337C5: '1'
## Warning: Coercing text to numeric in E12338 / R12338C5: '2'
## Warning: Coercing text to numeric in E12339 / R12339C5: '2'
## Warning: Coercing text to numeric in E12340 / R12340C5: '2'
## Warning: Coercing text to numeric in E12341 / R12341C5: '2'
## Warning: Coercing text to numeric in E12342 / R12342C5: '2'
## Warning: Coercing text to numeric in E12343 / R12343C5: '2'
## Warning: Coercing text to numeric in E12344 / R12344C5: '1'
## Warning: Coercing text to numeric in E12345 / R12345C5: '1'
## Warning: Coercing text to numeric in E12346 / R12346C5: '1'
## Warning: Coercing text to numeric in E12347 / R12347C5: '1'
## Warning: Coercing text to numeric in E12348 / R12348C5: '1'
## Warning: Coercing text to numeric in E12349 / R12349C5: '1'
## Warning: Coercing text to numeric in E12350 / R12350C5: '1'
## Warning: Coercing text to numeric in E12351 / R12351C5: '1'
## Warning: Coercing text to numeric in E12352 / R12352C5: '1'
## Warning: Coercing text to numeric in E12353 / R12353C5: '1'
## Warning: Coercing text to numeric in E12354 / R12354C5: '1'
## Warning: Coercing text to numeric in E12355 / R12355C5: '1'
## Warning: Coercing text to numeric in E12356 / R12356C5: '2'
## Warning: Coercing text to numeric in E12357 / R12357C5: '2'
## Warning: Coercing text to numeric in E12358 / R12358C5: '2'
## Warning: Coercing text to numeric in E12359 / R12359C5: '2'
## Warning: Coercing text to numeric in E12360 / R12360C5: '2'
## Warning: Coercing text to numeric in E12361 / R12361C5: '2'
## Warning: Coercing text to numeric in E12362 / R12362C5: '2'
## Warning: Coercing text to numeric in E12363 / R12363C5: '2'
## Warning: Coercing text to numeric in E12364 / R12364C5: '2'
## Warning: Coercing text to numeric in E12365 / R12365C5: '2'
## Warning: Coercing text to numeric in E12366 / R12366C5: '2'
## Warning: Coercing text to numeric in E12367 / R12367C5: '2'
## Warning: Coercing text to numeric in E12368 / R12368C5: '1'
## Warning: Coercing text to numeric in E12369 / R12369C5: '1'
## Warning: Coercing text to numeric in E12370 / R12370C5: '1'
## Warning: Coercing text to numeric in E12371 / R12371C5: '1'
## Warning: Coercing text to numeric in E12372 / R12372C5: '1'
## Warning: Coercing text to numeric in E12373 / R12373C5: '1'
## Warning: Coercing text to numeric in E12374 / R12374C5: '1'
## Warning: Coercing text to numeric in E12375 / R12375C5: '1'
## Warning: Coercing text to numeric in E12376 / R12376C5: '1'
## Warning: Coercing text to numeric in E12377 / R12377C5: '1'
## Warning: Coercing text to numeric in E12378 / R12378C5: '1'
## Warning: Coercing text to numeric in E12379 / R12379C5: '1'
## Warning: Coercing text to numeric in E12380 / R12380C5: '1'
## Warning: Coercing text to numeric in E12381 / R12381C5: '1'
## Warning: Coercing text to numeric in E12382 / R12382C5: '1'
## Warning: Coercing text to numeric in E12383 / R12383C5: '1'
## Warning: Coercing text to numeric in E12384 / R12384C5: '1'
## Warning: Coercing text to numeric in E12385 / R12385C5: '1'
## Warning: Coercing text to numeric in E12386 / R12386C5: '1'
## Warning: Coercing text to numeric in E12387 / R12387C5: '1'
## Warning: Coercing text to numeric in E12388 / R12388C5: '1'
## Warning: Coercing text to numeric in E12389 / R12389C5: '1'
## Warning: Coercing text to numeric in E12390 / R12390C5: '1'
## Warning: Coercing text to numeric in E12391 / R12391C5: '1'
## Warning: Coercing text to numeric in E12392 / R12392C5: '1'
## Warning: Coercing text to numeric in E12393 / R12393C5: '1'
## Warning: Coercing text to numeric in E12394 / R12394C5: '1'
## Warning: Coercing text to numeric in E12395 / R12395C5: '1'
## Warning: Coercing text to numeric in E12396 / R12396C5: '1'
## Warning: Coercing text to numeric in E12397 / R12397C5: '1'
## Warning: Coercing text to numeric in E12398 / R12398C5: '1'
## Warning: Coercing text to numeric in E12399 / R12399C5: '1'
## Warning: Coercing text to numeric in E12400 / R12400C5: '1'
## Warning: Coercing text to numeric in E12401 / R12401C5: '1'
## Warning: Coercing text to numeric in E12402 / R12402C5: '1'
## Warning: Coercing text to numeric in E12403 / R12403C5: '1'
## Warning: Coercing text to numeric in E12404 / R12404C5: '1'
## Warning: Coercing text to numeric in E12405 / R12405C5: '1'
## Warning: Coercing text to numeric in E12406 / R12406C5: '1'
## Warning: Coercing text to numeric in E12407 / R12407C5: '1'
## Warning: Coercing text to numeric in E12408 / R12408C5: '1'
## Warning: Coercing text to numeric in E12409 / R12409C5: '1'
## Warning: Coercing text to numeric in E12410 / R12410C5: '2'
## Warning: Coercing text to numeric in E12411 / R12411C5: '2'
## Warning: Coercing text to numeric in E12412 / R12412C5: '2'
## Warning: Coercing text to numeric in E12413 / R12413C5: '2'
## Warning: Coercing text to numeric in E12414 / R12414C5: '2'
## Warning: Coercing text to numeric in E12415 / R12415C5: '2'
## Warning: Coercing text to numeric in E12416 / R12416C5: '2'
## Warning: Coercing text to numeric in E12417 / R12417C5: '2'
## Warning: Coercing text to numeric in E12418 / R12418C5: '2'
## Warning: Coercing text to numeric in E12419 / R12419C5: '2'
## Warning: Coercing text to numeric in E12420 / R12420C5: '2'
## Warning: Coercing text to numeric in E12421 / R12421C5: '2'
## Warning: Coercing text to numeric in E12422 / R12422C5: '1'
## Warning: Coercing text to numeric in E12423 / R12423C5: '1'
## Warning: Coercing text to numeric in E12424 / R12424C5: '1'
## Warning: Coercing text to numeric in E12425 / R12425C5: '1'
## Warning: Coercing text to numeric in E12426 / R12426C5: '1'
## Warning: Coercing text to numeric in E12427 / R12427C5: '1'
## Warning: Coercing text to numeric in E12428 / R12428C5: '2'
## Warning: Coercing text to numeric in E12429 / R12429C5: '2'
## Warning: Coercing text to numeric in E12430 / R12430C5: '2'
## Warning: Coercing text to numeric in E12431 / R12431C5: '2'
## Warning: Coercing text to numeric in E12432 / R12432C5: '2'
## Warning: Coercing text to numeric in E12433 / R12433C5: '2'
## Warning: Coercing text to numeric in E12434 / R12434C5: '2'
## Warning: Coercing text to numeric in E12435 / R12435C5: '2'
## Warning: Coercing text to numeric in E12436 / R12436C5: '2'
## Warning: Coercing text to numeric in E12437 / R12437C5: '2'
## Warning: Coercing text to numeric in E12438 / R12438C5: '2'
## Warning: Coercing text to numeric in E12439 / R12439C5: '2'
## Warning: Coercing text to numeric in E12440 / R12440C5: '2'
## Warning: Coercing text to numeric in E12441 / R12441C5: '2'
## Warning: Coercing text to numeric in E12442 / R12442C5: '2'
## Warning: Coercing text to numeric in E12443 / R12443C5: '2'
## Warning: Coercing text to numeric in E12444 / R12444C5: '2'
## Warning: Coercing text to numeric in E12445 / R12445C5: '2'
## Warning: Coercing text to numeric in E12446 / R12446C5: '2'
## Warning: Coercing text to numeric in E12447 / R12447C5: '2'
## Warning: Coercing text to numeric in E12448 / R12448C5: '2'
## Warning: Coercing text to numeric in E12449 / R12449C5: '2'
## Warning: Coercing text to numeric in E12450 / R12450C5: '2'
## Warning: Coercing text to numeric in E12451 / R12451C5: '2'
## Warning: Coercing text to numeric in E12452 / R12452C5: '1'
## Warning: Coercing text to numeric in E12453 / R12453C5: '1'
## Warning: Coercing text to numeric in E12454 / R12454C5: '1'
## Warning: Coercing text to numeric in E12455 / R12455C5: '1'
## Warning: Coercing text to numeric in E12456 / R12456C5: '1'
## Warning: Coercing text to numeric in E12457 / R12457C5: '1'
## Warning: Coercing text to numeric in E12458 / R12458C5: '2'
## Warning: Coercing text to numeric in E12459 / R12459C5: '2'
## Warning: Coercing text to numeric in E12460 / R12460C5: '2'
## Warning: Coercing text to numeric in E12461 / R12461C5: '2'
## Warning: Coercing text to numeric in E12462 / R12462C5: '2'
## Warning: Coercing text to numeric in E12463 / R12463C5: '2'
## Warning: Coercing text to numeric in E12464 / R12464C5: '2'
## Warning: Coercing text to numeric in E12465 / R12465C5: '2'
## Warning: Coercing text to numeric in E12466 / R12466C5: '2'
## Warning: Coercing text to numeric in E12467 / R12467C5: '2'
## Warning: Coercing text to numeric in E12468 / R12468C5: '2'
## Warning: Coercing text to numeric in E12469 / R12469C5: '2'
## Warning: Coercing text to numeric in E12470 / R12470C5: '2'
## Warning: Coercing text to numeric in E12471 / R12471C5: '2'
## Warning: Coercing text to numeric in E12472 / R12472C5: '2'
## Warning: Coercing text to numeric in E12473 / R12473C5: '2'
## Warning: Coercing text to numeric in E12474 / R12474C5: '2'
## Warning: Coercing text to numeric in E12475 / R12475C5: '2'
## Warning: Coercing text to numeric in E12476 / R12476C5: '2'
## Warning: Coercing text to numeric in E12477 / R12477C5: '2'
## Warning: Coercing text to numeric in E12478 / R12478C5: '2'
## Warning: Coercing text to numeric in E12479 / R12479C5: '2'
## Warning: Coercing text to numeric in E12480 / R12480C5: '2'
## Warning: Coercing text to numeric in E12481 / R12481C5: '2'
## Warning: Coercing text to numeric in E12482 / R12482C5: '2'
## Warning: Coercing text to numeric in E12483 / R12483C5: '2'
## Warning: Coercing text to numeric in E12484 / R12484C5: '2'
## Warning: Coercing text to numeric in E12485 / R12485C5: '2'
## Warning: Coercing text to numeric in E12486 / R12486C5: '2'
## Warning: Coercing text to numeric in E12487 / R12487C5: '2'
## Warning: Coercing text to numeric in E12488 / R12488C5: '2'
## Warning: Coercing text to numeric in E12489 / R12489C5: '2'
## Warning: Coercing text to numeric in E12490 / R12490C5: '2'
## Warning: Coercing text to numeric in E12491 / R12491C5: '2'
## Warning: Coercing text to numeric in E12492 / R12492C5: '2'
## Warning: Coercing text to numeric in E12493 / R12493C5: '2'
## Warning: Coercing text to numeric in E12494 / R12494C5: '1'
## Warning: Coercing text to numeric in E12495 / R12495C5: '1'
## Warning: Coercing text to numeric in E12496 / R12496C5: '1'
## Warning: Coercing text to numeric in E12497 / R12497C5: '1'
## Warning: Coercing text to numeric in E12498 / R12498C5: '1'
## Warning: Coercing text to numeric in E12499 / R12499C5: '1'
## Warning: Coercing text to numeric in E12500 / R12500C5: '1'
## Warning: Coercing text to numeric in E12501 / R12501C5: '1'
## Warning: Coercing text to numeric in E12502 / R12502C5: '1'
## Warning: Coercing text to numeric in E12503 / R12503C5: '1'
## Warning: Coercing text to numeric in E12504 / R12504C5: '1'
## Warning: Coercing text to numeric in E12505 / R12505C5: '1'
## Warning: Coercing text to numeric in E12506 / R12506C5: '1'
## Warning: Coercing text to numeric in E12507 / R12507C5: '1'
## Warning: Coercing text to numeric in E12508 / R12508C5: '1'
## Warning: Coercing text to numeric in E12509 / R12509C5: '1'
## Warning: Coercing text to numeric in E12510 / R12510C5: '1'
## Warning: Coercing text to numeric in E12511 / R12511C5: '1'
## Warning: Coercing text to numeric in E12512 / R12512C5: '1'
## Warning: Coercing text to numeric in E12513 / R12513C5: '1'
## Warning: Coercing text to numeric in E12514 / R12514C5: '1'
## Warning: Coercing text to numeric in E12515 / R12515C5: '1'
## Warning: Coercing text to numeric in E12516 / R12516C5: '1'
## Warning: Coercing text to numeric in E12517 / R12517C5: '1'
## Warning: Coercing text to numeric in E12518 / R12518C5: '2'
## Warning: Coercing text to numeric in E12519 / R12519C5: '2'
## Warning: Coercing text to numeric in E12520 / R12520C5: '2'
## Warning: Coercing text to numeric in E12521 / R12521C5: '2'
## Warning: Coercing text to numeric in E12522 / R12522C5: '2'
## Warning: Coercing text to numeric in E12523 / R12523C5: '2'
## Warning: Coercing text to numeric in E12524 / R12524C5: '1'
## Warning: Coercing text to numeric in E12525 / R12525C5: '1'
## Warning: Coercing text to numeric in E12526 / R12526C5: '1'
## Warning: Coercing text to numeric in E12527 / R12527C5: '1'
## Warning: Coercing text to numeric in E12528 / R12528C5: '1'
## Warning: Coercing text to numeric in E12529 / R12529C5: '1'
## Warning: Coercing text to numeric in E12530 / R12530C5: '2'
## Warning: Coercing text to numeric in E12531 / R12531C5: '2'
## Warning: Coercing text to numeric in E12532 / R12532C5: '2'
## Warning: Coercing text to numeric in E12533 / R12533C5: '2'
## Warning: Coercing text to numeric in E12534 / R12534C5: '2'
## Warning: Coercing text to numeric in E12535 / R12535C5: '2'
## Warning: Coercing text to numeric in E12536 / R12536C5: '2'
## Warning: Coercing text to numeric in E12537 / R12537C5: '2'
## Warning: Coercing text to numeric in E12538 / R12538C5: '2'
## Warning: Coercing text to numeric in E12539 / R12539C5: '2'
## Warning: Coercing text to numeric in E12540 / R12540C5: '2'
## Warning: Coercing text to numeric in E12541 / R12541C5: '2'
## Warning: Coercing text to numeric in E12542 / R12542C5: '1'
## Warning: Coercing text to numeric in E12543 / R12543C5: '1'
## Warning: Coercing text to numeric in E12544 / R12544C5: '1'
## Warning: Coercing text to numeric in E12545 / R12545C5: '1'
## Warning: Coercing text to numeric in E12546 / R12546C5: '1'
## Warning: Coercing text to numeric in E12547 / R12547C5: '1'
## Warning: Coercing text to numeric in E12548 / R12548C5: '2'
## Warning: Coercing text to numeric in E12549 / R12549C5: '2'
## Warning: Coercing text to numeric in E12550 / R12550C5: '2'
## Warning: Coercing text to numeric in E12551 / R12551C5: '2'
## Warning: Coercing text to numeric in E12552 / R12552C5: '2'
## Warning: Coercing text to numeric in E12553 / R12553C5: '2'
## Warning: Coercing text to numeric in E12554 / R12554C5: '2'
## Warning: Coercing text to numeric in E12555 / R12555C5: '2'
## Warning: Coercing text to numeric in E12556 / R12556C5: '2'
## Warning: Coercing text to numeric in E12557 / R12557C5: '2'
## Warning: Coercing text to numeric in E12558 / R12558C5: '2'
## Warning: Coercing text to numeric in E12559 / R12559C5: '2'
## Warning: Coercing text to numeric in E12560 / R12560C5: '1'
## Warning: Coercing text to numeric in E12561 / R12561C5: '1'
## Warning: Coercing text to numeric in E12562 / R12562C5: '1'
## Warning: Coercing text to numeric in E12563 / R12563C5: '1'
## Warning: Coercing text to numeric in E12564 / R12564C5: '1'
## Warning: Coercing text to numeric in E12565 / R12565C5: '1'
## Warning: Coercing text to numeric in E12566 / R12566C5: '2'
## Warning: Coercing text to numeric in E12567 / R12567C5: '2'
## Warning: Coercing text to numeric in E12568 / R12568C5: '2'
## Warning: Coercing text to numeric in E12569 / R12569C5: '2'
## Warning: Coercing text to numeric in E12570 / R12570C5: '2'
## Warning: Coercing text to numeric in E12571 / R12571C5: '2'
## Warning: Coercing text to numeric in E12572 / R12572C5: '1'
## Warning: Coercing text to numeric in E12573 / R12573C5: '1'
## Warning: Coercing text to numeric in E12574 / R12574C5: '1'
## Warning: Coercing text to numeric in E12575 / R12575C5: '1'
## Warning: Coercing text to numeric in E12576 / R12576C5: '1'
## Warning: Coercing text to numeric in E12577 / R12577C5: '1'
## Warning: Coercing text to numeric in E12578 / R12578C5: '1'
## Warning: Coercing text to numeric in E12579 / R12579C5: '1'
## Warning: Coercing text to numeric in E12580 / R12580C5: '1'
## Warning: Coercing text to numeric in E12581 / R12581C5: '1'
## Warning: Coercing text to numeric in E12582 / R12582C5: '1'
## Warning: Coercing text to numeric in E12583 / R12583C5: '1'
## Warning: Coercing text to numeric in E12584 / R12584C5: '1'
## Warning: Coercing text to numeric in E12585 / R12585C5: '1'
## Warning: Coercing text to numeric in E12586 / R12586C5: '1'
## Warning: Coercing text to numeric in E12587 / R12587C5: '1'
## Warning: Coercing text to numeric in E12588 / R12588C5: '1'
## Warning: Coercing text to numeric in E12589 / R12589C5: '1'
## Warning: Coercing text to numeric in E12590 / R12590C5: '1'
## Warning: Coercing text to numeric in E12591 / R12591C5: '1'
## Warning: Coercing text to numeric in E12592 / R12592C5: '1'
## Warning: Coercing text to numeric in E12593 / R12593C5: '1'
## Warning: Coercing text to numeric in E12594 / R12594C5: '1'
## Warning: Coercing text to numeric in E12595 / R12595C5: '1'
## Warning: Coercing text to numeric in E12596 / R12596C5: '2'
## Warning: Coercing text to numeric in E12597 / R12597C5: '2'
## Warning: Coercing text to numeric in E12598 / R12598C5: '2'
## Warning: Coercing text to numeric in E12599 / R12599C5: '2'
## Warning: Coercing text to numeric in E12600 / R12600C5: '2'
## Warning: Coercing text to numeric in E12601 / R12601C5: '2'
## Warning: Coercing text to numeric in E12602 / R12602C5: '1'
## Warning: Coercing text to numeric in E12603 / R12603C5: '1'
## Warning: Coercing text to numeric in E12604 / R12604C5: '1'
## Warning: Coercing text to numeric in E12605 / R12605C5: '1'
## Warning: Coercing text to numeric in E12606 / R12606C5: '1'
## Warning: Coercing text to numeric in E12607 / R12607C5: '1'
## Warning: Coercing text to numeric in E12608 / R12608C5: '2'
## Warning: Coercing text to numeric in E12609 / R12609C5: '2'
## Warning: Coercing text to numeric in E12610 / R12610C5: '2'
## Warning: Coercing text to numeric in E12611 / R12611C5: '2'
## Warning: Coercing text to numeric in E12612 / R12612C5: '2'
## Warning: Coercing text to numeric in E12613 / R12613C5: '2'
## Warning: Coercing text to numeric in E12614 / R12614C5: '1'
## Warning: Coercing text to numeric in E12615 / R12615C5: '1'
## Warning: Coercing text to numeric in E12616 / R12616C5: '1'
## Warning: Coercing text to numeric in E12617 / R12617C5: '1'
## Warning: Coercing text to numeric in E12618 / R12618C5: '1'
## Warning: Coercing text to numeric in E12619 / R12619C5: '1'
## Warning: Coercing text to numeric in E12620 / R12620C5: '2'
## Warning: Coercing text to numeric in E12621 / R12621C5: '2'
## Warning: Coercing text to numeric in E12622 / R12622C5: '2'
## Warning: Coercing text to numeric in E12623 / R12623C5: '2'
## Warning: Coercing text to numeric in E12624 / R12624C5: '2'
## Warning: Coercing text to numeric in E12625 / R12625C5: '2'
## Warning: Coercing text to numeric in E12626 / R12626C5: '1'
## Warning: Coercing text to numeric in E12627 / R12627C5: '1'
## Warning: Coercing text to numeric in E12628 / R12628C5: '1'
## Warning: Coercing text to numeric in E12629 / R12629C5: '1'
## Warning: Coercing text to numeric in E12630 / R12630C5: '1'
## Warning: Coercing text to numeric in E12631 / R12631C5: '1'
## Warning: Coercing text to numeric in E12632 / R12632C5: '2'
## Warning: Coercing text to numeric in E12633 / R12633C5: '2'
## Warning: Coercing text to numeric in E12634 / R12634C5: '2'
## Warning: Coercing text to numeric in E12635 / R12635C5: '2'
## Warning: Coercing text to numeric in E12636 / R12636C5: '2'
## Warning: Coercing text to numeric in E12637 / R12637C5: '2'
## Warning: Coercing text to numeric in E12638 / R12638C5: '1'
## Warning: Coercing text to numeric in E12639 / R12639C5: '1'
## Warning: Coercing text to numeric in E12640 / R12640C5: '1'
## Warning: Coercing text to numeric in E12641 / R12641C5: '1'
## Warning: Coercing text to numeric in E12642 / R12642C5: '1'
## Warning: Coercing text to numeric in E12643 / R12643C5: '1'
## Warning: Coercing text to numeric in E12644 / R12644C5: '1'
## Warning: Coercing text to numeric in E12645 / R12645C5: '1'
## Warning: Coercing text to numeric in E12646 / R12646C5: '1'
## Warning: Coercing text to numeric in E12647 / R12647C5: '1'
## Warning: Coercing text to numeric in E12648 / R12648C5: '1'
## Warning: Coercing text to numeric in E12649 / R12649C5: '1'
## Warning: Coercing text to numeric in E12650 / R12650C5: '2'
## Warning: Coercing text to numeric in E12651 / R12651C5: '2'
## Warning: Coercing text to numeric in E12652 / R12652C5: '2'
## Warning: Coercing text to numeric in E12653 / R12653C5: '2'
## Warning: Coercing text to numeric in E12654 / R12654C5: '2'
## Warning: Coercing text to numeric in E12655 / R12655C5: '2'
## Warning: Coercing text to numeric in E12656 / R12656C5: '2'
## Warning: Coercing text to numeric in E12657 / R12657C5: '2'
## Warning: Coercing text to numeric in E12658 / R12658C5: '2'
## Warning: Coercing text to numeric in E12659 / R12659C5: '2'
## Warning: Coercing text to numeric in E12660 / R12660C5: '2'
## Warning: Coercing text to numeric in E12661 / R12661C5: '2'
## Warning: Coercing text to numeric in E12662 / R12662C5: '2'
## Warning: Coercing text to numeric in E12663 / R12663C5: '2'
## Warning: Coercing text to numeric in E12664 / R12664C5: '2'
## Warning: Coercing text to numeric in E12665 / R12665C5: '2'
## Warning: Coercing text to numeric in E12666 / R12666C5: '2'
## Warning: Coercing text to numeric in E12667 / R12667C5: '2'
## Warning: Coercing text to numeric in E12668 / R12668C5: '2'
## Warning: Coercing text to numeric in E12669 / R12669C5: '2'
## Warning: Coercing text to numeric in E12670 / R12670C5: '2'
## Warning: Coercing text to numeric in E12671 / R12671C5: '2'
## Warning: Coercing text to numeric in E12672 / R12672C5: '2'
## Warning: Coercing text to numeric in E12673 / R12673C5: '2'
## Warning: Coercing text to numeric in E12674 / R12674C5: '1'
## Warning: Coercing text to numeric in E12675 / R12675C5: '1'
## Warning: Coercing text to numeric in E12676 / R12676C5: '1'
## Warning: Coercing text to numeric in E12677 / R12677C5: '1'
## Warning: Coercing text to numeric in E12678 / R12678C5: '1'
## Warning: Coercing text to numeric in E12679 / R12679C5: '1'
## Warning: Coercing text to numeric in E12680 / R12680C5: '2'
## Warning: Coercing text to numeric in E12681 / R12681C5: '2'
## Warning: Coercing text to numeric in E12682 / R12682C5: '2'
## Warning: Coercing text to numeric in E12683 / R12683C5: '2'
## Warning: Coercing text to numeric in E12684 / R12684C5: '2'
## Warning: Coercing text to numeric in E12685 / R12685C5: '2'
## Warning: Coercing text to numeric in E12686 / R12686C5: '1'
## Warning: Coercing text to numeric in E12687 / R12687C5: '1'
## Warning: Coercing text to numeric in E12688 / R12688C5: '1'
## Warning: Coercing text to numeric in E12689 / R12689C5: '1'
## Warning: Coercing text to numeric in E12690 / R12690C5: '1'
## Warning: Coercing text to numeric in E12691 / R12691C5: '1'
## Warning: Coercing text to numeric in E12692 / R12692C5: '1'
## Warning: Coercing text to numeric in E12693 / R12693C5: '1'
## Warning: Coercing text to numeric in E12694 / R12694C5: '1'
## Warning: Coercing text to numeric in E12695 / R12695C5: '1'
## Warning: Coercing text to numeric in E12696 / R12696C5: '1'
## Warning: Coercing text to numeric in E12697 / R12697C5: '1'
## Warning: Coercing text to numeric in E12698 / R12698C5: '1'
## Warning: Coercing text to numeric in E12699 / R12699C5: '1'
## Warning: Coercing text to numeric in E12700 / R12700C5: '1'
## Warning: Coercing text to numeric in E12701 / R12701C5: '1'
## Warning: Coercing text to numeric in E12702 / R12702C5: '1'
## Warning: Coercing text to numeric in E12703 / R12703C5: '1'
## Warning: Coercing text to numeric in E12704 / R12704C5: '2'
## Warning: Coercing text to numeric in E12705 / R12705C5: '2'
## Warning: Coercing text to numeric in E12706 / R12706C5: '2'
## Warning: Coercing text to numeric in E12707 / R12707C5: '2'
## Warning: Coercing text to numeric in E12708 / R12708C5: '2'
## Warning: Coercing text to numeric in E12709 / R12709C5: '2'
## Warning: Coercing text to numeric in E12710 / R12710C5: '1'
## Warning: Coercing text to numeric in E12711 / R12711C5: '1'
## Warning: Coercing text to numeric in E12712 / R12712C5: '1'
## Warning: Coercing text to numeric in E12713 / R12713C5: '1'
## Warning: Coercing text to numeric in E12714 / R12714C5: '1'
## Warning: Coercing text to numeric in E12715 / R12715C5: '1'
## Warning: Coercing text to numeric in E12716 / R12716C5: '1'
## Warning: Coercing text to numeric in E12717 / R12717C5: '1'
## Warning: Coercing text to numeric in E12718 / R12718C5: '1'
## Warning: Coercing text to numeric in E12719 / R12719C5: '1'
## Warning: Coercing text to numeric in E12720 / R12720C5: '1'
## Warning: Coercing text to numeric in E12721 / R12721C5: '1'
## Warning: Coercing text to numeric in E12722 / R12722C5: '1'
## Warning: Coercing text to numeric in E12723 / R12723C5: '1'
## Warning: Coercing text to numeric in E12724 / R12724C5: '1'
## Warning: Coercing text to numeric in E12725 / R12725C5: '1'
## Warning: Coercing text to numeric in E12726 / R12726C5: '1'
## Warning: Coercing text to numeric in E12727 / R12727C5: '1'
## Warning: Coercing text to numeric in E12728 / R12728C5: '1'
## Warning: Coercing text to numeric in E12729 / R12729C5: '1'
## Warning: Coercing text to numeric in E12730 / R12730C5: '1'
## Warning: Coercing text to numeric in E12731 / R12731C5: '1'
## Warning: Coercing text to numeric in E12732 / R12732C5: '1'
## Warning: Coercing text to numeric in E12733 / R12733C5: '1'
## Warning: Coercing text to numeric in E12734 / R12734C5: '1'
## Warning: Coercing text to numeric in E12735 / R12735C5: '1'
## Warning: Coercing text to numeric in E12736 / R12736C5: '1'
## Warning: Coercing text to numeric in E12737 / R12737C5: '1'
## Warning: Coercing text to numeric in E12738 / R12738C5: '1'
## Warning: Coercing text to numeric in E12739 / R12739C5: '1'
## Warning: Coercing text to numeric in E12740 / R12740C5: '1'
## Warning: Coercing text to numeric in E12741 / R12741C5: '1'
## Warning: Coercing text to numeric in E12742 / R12742C5: '1'
## Warning: Coercing text to numeric in E12743 / R12743C5: '1'
## Warning: Coercing text to numeric in E12744 / R12744C5: '1'
## Warning: Coercing text to numeric in E12745 / R12745C5: '1'
## Warning: Coercing text to numeric in E12746 / R12746C5: '2'
## Warning: Coercing text to numeric in E12747 / R12747C5: '2'
## Warning: Coercing text to numeric in E12748 / R12748C5: '2'
## Warning: Coercing text to numeric in E12749 / R12749C5: '2'
## Warning: Coercing text to numeric in E12750 / R12750C5: '2'
## Warning: Coercing text to numeric in E12751 / R12751C5: '2'
## Warning: Coercing text to numeric in E12752 / R12752C5: '1'
## Warning: Coercing text to numeric in E12753 / R12753C5: '1'
## Warning: Coercing text to numeric in E12754 / R12754C5: '1'
## Warning: Coercing text to numeric in E12755 / R12755C5: '1'
## Warning: Coercing text to numeric in E12756 / R12756C5: '1'
## Warning: Coercing text to numeric in E12757 / R12757C5: '1'
## Warning: Coercing text to numeric in E12758 / R12758C5: '1'
## Warning: Coercing text to numeric in E12759 / R12759C5: '1'
## Warning: Coercing text to numeric in E12760 / R12760C5: '1'
## Warning: Coercing text to numeric in E12761 / R12761C5: '1'
## Warning: Coercing text to numeric in E12762 / R12762C5: '1'
## Warning: Coercing text to numeric in E12763 / R12763C5: '1'
## Warning: Coercing text to numeric in E12764 / R12764C5: '2'
## Warning: Coercing text to numeric in E12765 / R12765C5: '2'
## Warning: Coercing text to numeric in E12766 / R12766C5: '2'
## Warning: Coercing text to numeric in E12767 / R12767C5: '2'
## Warning: Coercing text to numeric in E12768 / R12768C5: '2'
## Warning: Coercing text to numeric in E12769 / R12769C5: '2'
## Warning: Coercing text to numeric in E12770 / R12770C5: '1'
## Warning: Coercing text to numeric in E12771 / R12771C5: '1'
## Warning: Coercing text to numeric in E12772 / R12772C5: '1'
## Warning: Coercing text to numeric in E12773 / R12773C5: '1'
## Warning: Coercing text to numeric in E12774 / R12774C5: '1'
## Warning: Coercing text to numeric in E12775 / R12775C5: '1'
## Warning: Coercing text to numeric in E12776 / R12776C5: '2'
## Warning: Coercing text to numeric in E12777 / R12777C5: '2'
## Warning: Coercing text to numeric in E12778 / R12778C5: '2'
## Warning: Coercing text to numeric in E12779 / R12779C5: '2'
## Warning: Coercing text to numeric in E12780 / R12780C5: '2'
## Warning: Coercing text to numeric in E12781 / R12781C5: '2'
## Warning: Coercing text to numeric in E12782 / R12782C5: '1'
## Warning: Coercing text to numeric in E12783 / R12783C5: '1'
## Warning: Coercing text to numeric in E12784 / R12784C5: '1'
## Warning: Coercing text to numeric in E12785 / R12785C5: '1'
## Warning: Coercing text to numeric in E12786 / R12786C5: '1'
## Warning: Coercing text to numeric in E12787 / R12787C5: '1'
## Warning: Coercing text to numeric in E12788 / R12788C5: '2'
## Warning: Coercing text to numeric in E12789 / R12789C5: '2'
## Warning: Coercing text to numeric in E12790 / R12790C5: '2'
## Warning: Coercing text to numeric in E12791 / R12791C5: '2'
## Warning: Coercing text to numeric in E12792 / R12792C5: '2'
## Warning: Coercing text to numeric in E12793 / R12793C5: '2'
## Warning: Coercing text to numeric in E12794 / R12794C5: '1'
## Warning: Coercing text to numeric in E12795 / R12795C5: '1'
## Warning: Coercing text to numeric in E12796 / R12796C5: '1'
## Warning: Coercing text to numeric in E12797 / R12797C5: '1'
## Warning: Coercing text to numeric in E12798 / R12798C5: '1'
## Warning: Coercing text to numeric in E12799 / R12799C5: '1'
## Warning: Coercing text to numeric in E12800 / R12800C5: '1'
## Warning: Coercing text to numeric in E12801 / R12801C5: '1'
## Warning: Coercing text to numeric in E12802 / R12802C5: '1'
## Warning: Coercing text to numeric in E12803 / R12803C5: '1'
## Warning: Coercing text to numeric in E12804 / R12804C5: '1'
## Warning: Coercing text to numeric in E12805 / R12805C5: '1'
## Warning: Coercing text to numeric in E12806 / R12806C5: '1'
## Warning: Coercing text to numeric in E12807 / R12807C5: '1'
## Warning: Coercing text to numeric in E12808 / R12808C5: '1'
## Warning: Coercing text to numeric in E12809 / R12809C5: '1'
## Warning: Coercing text to numeric in E12810 / R12810C5: '1'
## Warning: Coercing text to numeric in E12811 / R12811C5: '1'
## Warning: Coercing text to numeric in E12812 / R12812C5: '2'
## Warning: Coercing text to numeric in E12813 / R12813C5: '2'
## Warning: Coercing text to numeric in E12814 / R12814C5: '2'
## Warning: Coercing text to numeric in E12815 / R12815C5: '2'
## Warning: Coercing text to numeric in E12816 / R12816C5: '2'
## Warning: Coercing text to numeric in E12817 / R12817C5: '2'
## Warning: Coercing text to numeric in E12818 / R12818C5: '2'
## Warning: Coercing text to numeric in E12819 / R12819C5: '2'
## Warning: Coercing text to numeric in E12820 / R12820C5: '2'
## Warning: Coercing text to numeric in E12821 / R12821C5: '2'
## Warning: Coercing text to numeric in E12822 / R12822C5: '2'
## Warning: Coercing text to numeric in E12823 / R12823C5: '2'
## Warning: Coercing text to numeric in E12824 / R12824C5: '2'
## Warning: Coercing text to numeric in E12825 / R12825C5: '2'
## Warning: Coercing text to numeric in E12826 / R12826C5: '2'
## Warning: Coercing text to numeric in E12827 / R12827C5: '2'
## Warning: Coercing text to numeric in E12828 / R12828C5: '2'
## Warning: Coercing text to numeric in E12829 / R12829C5: '2'
## Warning: Coercing text to numeric in E12830 / R12830C5: '2'
## Warning: Coercing text to numeric in E12831 / R12831C5: '2'
## Warning: Coercing text to numeric in E12832 / R12832C5: '2'
## Warning: Coercing text to numeric in E12833 / R12833C5: '2'
## Warning: Coercing text to numeric in E12834 / R12834C5: '2'
## Warning: Coercing text to numeric in E12835 / R12835C5: '2'
## Warning: Coercing text to numeric in E12836 / R12836C5: '2'
## Warning: Coercing text to numeric in E12837 / R12837C5: '2'
## Warning: Coercing text to numeric in E12838 / R12838C5: '2'
## Warning: Coercing text to numeric in E12839 / R12839C5: '2'
## Warning: Coercing text to numeric in E12840 / R12840C5: '2'
## Warning: Coercing text to numeric in E12841 / R12841C5: '2'
## Warning: Coercing text to numeric in E12842 / R12842C5: '2'
## Warning: Coercing text to numeric in E12843 / R12843C5: '2'
## Warning: Coercing text to numeric in E12844 / R12844C5: '2'
## Warning: Coercing text to numeric in E12845 / R12845C5: '2'
## Warning: Coercing text to numeric in E12846 / R12846C5: '2'
## Warning: Coercing text to numeric in E12847 / R12847C5: '2'
## Warning: Coercing text to numeric in E12848 / R12848C5: '1'
## Warning: Coercing text to numeric in E12849 / R12849C5: '1'
## Warning: Coercing text to numeric in E12850 / R12850C5: '1'
## Warning: Coercing text to numeric in E12851 / R12851C5: '1'
## Warning: Coercing text to numeric in E12852 / R12852C5: '1'
## Warning: Coercing text to numeric in E12853 / R12853C5: '1'
## Warning: Coercing text to numeric in E12854 / R12854C5: '2'
## Warning: Coercing text to numeric in E12855 / R12855C5: '2'
## Warning: Coercing text to numeric in E12856 / R12856C5: '2'
## Warning: Coercing text to numeric in E12857 / R12857C5: '2'
## Warning: Coercing text to numeric in E12858 / R12858C5: '2'
## Warning: Coercing text to numeric in E12859 / R12859C5: '2'
## Warning: Coercing text to numeric in E12860 / R12860C5: '1'
## Warning: Coercing text to numeric in E12861 / R12861C5: '1'
## Warning: Coercing text to numeric in E12862 / R12862C5: '1'
## Warning: Coercing text to numeric in E12863 / R12863C5: '1'
## Warning: Coercing text to numeric in E12864 / R12864C5: '1'
## Warning: Coercing text to numeric in E12865 / R12865C5: '1'
## Warning: Coercing text to numeric in E12866 / R12866C5: '1'
## Warning: Coercing text to numeric in E12867 / R12867C5: '1'
## Warning: Coercing text to numeric in E12868 / R12868C5: '1'
## Warning: Coercing text to numeric in E12869 / R12869C5: '1'
## Warning: Coercing text to numeric in E12870 / R12870C5: '1'
## Warning: Coercing text to numeric in E12871 / R12871C5: '1'
## Warning: Coercing text to numeric in E12872 / R12872C5: '2'
## Warning: Coercing text to numeric in E12873 / R12873C5: '2'
## Warning: Coercing text to numeric in E12874 / R12874C5: '2'
## Warning: Coercing text to numeric in E12875 / R12875C5: '2'
## Warning: Coercing text to numeric in E12876 / R12876C5: '2'
## Warning: Coercing text to numeric in E12877 / R12877C5: '2'
## Warning: Coercing text to numeric in E12878 / R12878C5: '2'
## Warning: Coercing text to numeric in E12879 / R12879C5: '2'
## Warning: Coercing text to numeric in E12880 / R12880C5: '2'
## Warning: Coercing text to numeric in E12881 / R12881C5: '2'
## Warning: Coercing text to numeric in E12882 / R12882C5: '2'
## Warning: Coercing text to numeric in E12883 / R12883C5: '2'
## Warning: Coercing text to numeric in E12884 / R12884C5: '1'
## Warning: Coercing text to numeric in E12885 / R12885C5: '1'
## Warning: Coercing text to numeric in E12886 / R12886C5: '1'
## Warning: Coercing text to numeric in E12887 / R12887C5: '1'
## Warning: Coercing text to numeric in E12888 / R12888C5: '1'
## Warning: Coercing text to numeric in E12889 / R12889C5: '1'
## Warning: Coercing text to numeric in E12890 / R12890C5: '2'
## Warning: Coercing text to numeric in E12891 / R12891C5: '2'
## Warning: Coercing text to numeric in E12892 / R12892C5: '2'
## Warning: Coercing text to numeric in E12893 / R12893C5: '2'
## Warning: Coercing text to numeric in E12894 / R12894C5: '2'
## Warning: Coercing text to numeric in E12895 / R12895C5: '2'
## Warning: Coercing text to numeric in E12896 / R12896C5: '1'
## Warning: Coercing text to numeric in E12897 / R12897C5: '1'
## Warning: Coercing text to numeric in E12898 / R12898C5: '1'
## Warning: Coercing text to numeric in E12899 / R12899C5: '1'
## Warning: Coercing text to numeric in E12900 / R12900C5: '1'
## Warning: Coercing text to numeric in E12901 / R12901C5: '1'
## Warning: Coercing text to numeric in E12902 / R12902C5: '1'
## Warning: Coercing text to numeric in E12903 / R12903C5: '1'
## Warning: Coercing text to numeric in E12904 / R12904C5: '1'
## Warning: Coercing text to numeric in E12905 / R12905C5: '1'
## Warning: Coercing text to numeric in E12906 / R12906C5: '1'
## Warning: Coercing text to numeric in E12907 / R12907C5: '1'
## Warning: Coercing text to numeric in E12908 / R12908C5: '2'
## Warning: Coercing text to numeric in E12909 / R12909C5: '2'
## Warning: Coercing text to numeric in E12910 / R12910C5: '2'
## Warning: Coercing text to numeric in E12911 / R12911C5: '2'
## Warning: Coercing text to numeric in E12912 / R12912C5: '2'
## Warning: Coercing text to numeric in E12913 / R12913C5: '2'
## Warning: Coercing text to numeric in E12914 / R12914C5: '2'
## Warning: Coercing text to numeric in E12915 / R12915C5: '2'
## Warning: Coercing text to numeric in E12916 / R12916C5: '2'
## Warning: Coercing text to numeric in E12917 / R12917C5: '2'
## Warning: Coercing text to numeric in E12918 / R12918C5: '2'
## Warning: Coercing text to numeric in E12919 / R12919C5: '2'
## Warning: Coercing text to numeric in E12920 / R12920C5: '2'
## Warning: Coercing text to numeric in E12921 / R12921C5: '2'
## Warning: Coercing text to numeric in E12922 / R12922C5: '2'
## Warning: Coercing text to numeric in E12923 / R12923C5: '2'
## Warning: Coercing text to numeric in E12924 / R12924C5: '2'
## Warning: Coercing text to numeric in E12925 / R12925C5: '2'
## Warning: Coercing text to numeric in E12926 / R12926C5: '2'
## Warning: Coercing text to numeric in E12927 / R12927C5: '2'
## Warning: Coercing text to numeric in E12928 / R12928C5: '2'
## Warning: Coercing text to numeric in E12929 / R12929C5: '2'
## Warning: Coercing text to numeric in E12930 / R12930C5: '2'
## Warning: Coercing text to numeric in E12931 / R12931C5: '2'
## Warning: Coercing text to numeric in E12932 / R12932C5: '1'
## Warning: Coercing text to numeric in E12933 / R12933C5: '1'
## Warning: Coercing text to numeric in E12934 / R12934C5: '1'
## Warning: Coercing text to numeric in E12935 / R12935C5: '1'
## Warning: Coercing text to numeric in E12936 / R12936C5: '1'
## Warning: Coercing text to numeric in E12937 / R12937C5: '1'
## Warning: Coercing text to numeric in E12938 / R12938C5: '1'
## Warning: Coercing text to numeric in E12939 / R12939C5: '1'
## Warning: Coercing text to numeric in E12940 / R12940C5: '1'
## Warning: Coercing text to numeric in E12941 / R12941C5: '1'
## Warning: Coercing text to numeric in E12942 / R12942C5: '1'
## Warning: Coercing text to numeric in E12943 / R12943C5: '1'
## Warning: Coercing text to numeric in E12944 / R12944C5: '2'
## Warning: Coercing text to numeric in E12945 / R12945C5: '2'
## Warning: Coercing text to numeric in E12946 / R12946C5: '2'
## Warning: Coercing text to numeric in E12947 / R12947C5: '2'
## Warning: Coercing text to numeric in E12948 / R12948C5: '2'
## Warning: Coercing text to numeric in E12949 / R12949C5: '2'
## Warning: Coercing text to numeric in E12950 / R12950C5: '1'
## Warning: Coercing text to numeric in E12951 / R12951C5: '1'
## Warning: Coercing text to numeric in E12952 / R12952C5: '1'
## Warning: Coercing text to numeric in E12953 / R12953C5: '1'
## Warning: Coercing text to numeric in E12954 / R12954C5: '1'
## Warning: Coercing text to numeric in E12955 / R12955C5: '1'
## Warning: Coercing text to numeric in E12956 / R12956C5: '2'
## Warning: Coercing text to numeric in E12957 / R12957C5: '2'
## Warning: Coercing text to numeric in E12958 / R12958C5: '2'
## Warning: Coercing text to numeric in E12959 / R12959C5: '2'
## Warning: Coercing text to numeric in E12960 / R12960C5: '2'
## Warning: Coercing text to numeric in E12961 / R12961C5: '2'
## Warning: Coercing text to numeric in E12962 / R12962C5: '1'
## Warning: Coercing text to numeric in E12963 / R12963C5: '1'
## Warning: Coercing text to numeric in E12964 / R12964C5: '1'
## Warning: Coercing text to numeric in E12965 / R12965C5: '1'
## Warning: Coercing text to numeric in E12966 / R12966C5: '1'
## Warning: Coercing text to numeric in E12967 / R12967C5: '1'
## Warning: Coercing text to numeric in E12968 / R12968C5: '1'
## Warning: Coercing text to numeric in E12969 / R12969C5: '1'
## Warning: Coercing text to numeric in E12970 / R12970C5: '1'
## Warning: Coercing text to numeric in E12971 / R12971C5: '1'
## Warning: Coercing text to numeric in E12972 / R12972C5: '1'
## Warning: Coercing text to numeric in E12973 / R12973C5: '1'
## Warning: Coercing text to numeric in E12974 / R12974C5: '2'
## Warning: Coercing text to numeric in E12975 / R12975C5: '2'
## Warning: Coercing text to numeric in E12976 / R12976C5: '2'
## Warning: Coercing text to numeric in E12977 / R12977C5: '2'
## Warning: Coercing text to numeric in E12978 / R12978C5: '2'
## Warning: Coercing text to numeric in E12979 / R12979C5: '2'
## Warning: Coercing text to numeric in E12980 / R12980C5: '2'
## Warning: Coercing text to numeric in E12981 / R12981C5: '2'
## Warning: Coercing text to numeric in E12982 / R12982C5: '2'
## Warning: Coercing text to numeric in E12983 / R12983C5: '2'
## Warning: Coercing text to numeric in E12984 / R12984C5: '2'
## Warning: Coercing text to numeric in E12985 / R12985C5: '2'
## Warning: Coercing text to numeric in E12986 / R12986C5: '2'
## Warning: Coercing text to numeric in E12987 / R12987C5: '2'
## Warning: Coercing text to numeric in E12988 / R12988C5: '2'
## Warning: Coercing text to numeric in E12989 / R12989C5: '2'
## Warning: Coercing text to numeric in E12990 / R12990C5: '2'
## Warning: Coercing text to numeric in E12991 / R12991C5: '2'
## Warning: Coercing text to numeric in E12992 / R12992C5: '1'
## Warning: Coercing text to numeric in E12993 / R12993C5: '1'
## Warning: Coercing text to numeric in E12994 / R12994C5: '1'
## Warning: Coercing text to numeric in E12995 / R12995C5: '1'
## Warning: Coercing text to numeric in E12996 / R12996C5: '1'
## Warning: Coercing text to numeric in E12997 / R12997C5: '1'
## Warning: Coercing text to numeric in E12998 / R12998C5: '1'
## Warning: Coercing text to numeric in E12999 / R12999C5: '1'
## Warning: Coercing text to numeric in E13000 / R13000C5: '1'
## Warning: Coercing text to numeric in E13001 / R13001C5: '1'
## Warning: Coercing text to numeric in E13002 / R13002C5: '1'
## Warning: Coercing text to numeric in E13003 / R13003C5: '1'
## Warning: Coercing text to numeric in E13004 / R13004C5: '1'
## Warning: Coercing text to numeric in E13005 / R13005C5: '1'
## Warning: Coercing text to numeric in E13006 / R13006C5: '1'
## Warning: Coercing text to numeric in E13007 / R13007C5: '1'
## Warning: Coercing text to numeric in E13008 / R13008C5: '1'
## Warning: Coercing text to numeric in E13009 / R13009C5: '1'
## Warning: Coercing text to numeric in E13010 / R13010C5: '1'
## Warning: Coercing text to numeric in E13011 / R13011C5: '1'
## Warning: Coercing text to numeric in E13012 / R13012C5: '1'
## Warning: Coercing text to numeric in E13013 / R13013C5: '1'
## Warning: Coercing text to numeric in E13014 / R13014C5: '1'
## Warning: Coercing text to numeric in E13015 / R13015C5: '1'
## Warning: Coercing text to numeric in E13016 / R13016C5: '1'
## Warning: Coercing text to numeric in E13017 / R13017C5: '1'
## Warning: Coercing text to numeric in E13018 / R13018C5: '1'
## Warning: Coercing text to numeric in E13019 / R13019C5: '1'
## Warning: Coercing text to numeric in E13020 / R13020C5: '1'
## Warning: Coercing text to numeric in E13021 / R13021C5: '1'
## Warning: Coercing text to numeric in E13022 / R13022C5: '2'
## Warning: Coercing text to numeric in E13023 / R13023C5: '2'
## Warning: Coercing text to numeric in E13024 / R13024C5: '2'
## Warning: Coercing text to numeric in E13025 / R13025C5: '2'
## Warning: Coercing text to numeric in E13026 / R13026C5: '2'
## Warning: Coercing text to numeric in E13027 / R13027C5: '2'
## Warning: Coercing text to numeric in E13028 / R13028C5: '1'
## Warning: Coercing text to numeric in E13029 / R13029C5: '1'
## Warning: Coercing text to numeric in E13030 / R13030C5: '1'
## Warning: Coercing text to numeric in E13031 / R13031C5: '1'
## Warning: Coercing text to numeric in E13032 / R13032C5: '1'
## Warning: Coercing text to numeric in E13033 / R13033C5: '1'
## Warning: Coercing text to numeric in E13034 / R13034C5: '1'
## Warning: Coercing text to numeric in E13035 / R13035C5: '1'
## Warning: Coercing text to numeric in E13036 / R13036C5: '1'
## Warning: Coercing text to numeric in E13037 / R13037C5: '1'
## Warning: Coercing text to numeric in E13038 / R13038C5: '1'
## Warning: Coercing text to numeric in E13039 / R13039C5: '1'
## Warning: Coercing text to numeric in E13040 / R13040C5: '2'
## Warning: Coercing text to numeric in E13041 / R13041C5: '2'
## Warning: Coercing text to numeric in E13042 / R13042C5: '2'
## Warning: Coercing text to numeric in E13043 / R13043C5: '2'
## Warning: Coercing text to numeric in E13044 / R13044C5: '2'
## Warning: Coercing text to numeric in E13045 / R13045C5: '2'
## Warning: Coercing text to numeric in E13046 / R13046C5: '2'
## Warning: Coercing text to numeric in E13047 / R13047C5: '2'
## Warning: Coercing text to numeric in E13048 / R13048C5: '2'
## Warning: Coercing text to numeric in E13049 / R13049C5: '2'
## Warning: Coercing text to numeric in E13050 / R13050C5: '2'
## Warning: Coercing text to numeric in E13051 / R13051C5: '2'
## Warning: Coercing text to numeric in E13052 / R13052C5: '1'
## Warning: Coercing text to numeric in E13053 / R13053C5: '1'
## Warning: Coercing text to numeric in E13054 / R13054C5: '1'
## Warning: Coercing text to numeric in E13055 / R13055C5: '1'
## Warning: Coercing text to numeric in E13056 / R13056C5: '1'
## Warning: Coercing text to numeric in E13057 / R13057C5: '1'
## Warning: Coercing text to numeric in E13058 / R13058C5: '2'
## Warning: Coercing text to numeric in E13059 / R13059C5: '2'
## Warning: Coercing text to numeric in E13060 / R13060C5: '2'
## Warning: Coercing text to numeric in E13061 / R13061C5: '2'
## Warning: Coercing text to numeric in E13062 / R13062C5: '2'
## Warning: Coercing text to numeric in E13063 / R13063C5: '2'
## Warning: Coercing text to numeric in E13064 / R13064C5: '1'
## Warning: Coercing text to numeric in E13065 / R13065C5: '1'
## Warning: Coercing text to numeric in E13066 / R13066C5: '1'
## Warning: Coercing text to numeric in E13067 / R13067C5: '1'
## Warning: Coercing text to numeric in E13068 / R13068C5: '1'
## Warning: Coercing text to numeric in E13069 / R13069C5: '1'
## Warning: Coercing text to numeric in E13070 / R13070C5: '2'
## Warning: Coercing text to numeric in E13071 / R13071C5: '2'
## Warning: Coercing text to numeric in E13072 / R13072C5: '2'
## Warning: Coercing text to numeric in E13073 / R13073C5: '2'
## Warning: Coercing text to numeric in E13074 / R13074C5: '2'
## Warning: Coercing text to numeric in E13075 / R13075C5: '2'
## Warning: Coercing text to numeric in E13076 / R13076C5: '2'
## Warning: Coercing text to numeric in E13077 / R13077C5: '2'
## Warning: Coercing text to numeric in E13078 / R13078C5: '2'
## Warning: Coercing text to numeric in E13079 / R13079C5: '2'
## Warning: Coercing text to numeric in E13080 / R13080C5: '2'
## Warning: Coercing text to numeric in E13081 / R13081C5: '2'
## Warning: Coercing text to numeric in E13082 / R13082C5: '2'
## Warning: Coercing text to numeric in E13083 / R13083C5: '2'
## Warning: Coercing text to numeric in E13084 / R13084C5: '2'
## Warning: Coercing text to numeric in E13085 / R13085C5: '2'
## Warning: Coercing text to numeric in E13086 / R13086C5: '2'
## Warning: Coercing text to numeric in E13087 / R13087C5: '2'
## Warning: Coercing text to numeric in E13088 / R13088C5: '2'
## Warning: Coercing text to numeric in E13089 / R13089C5: '2'
## Warning: Coercing text to numeric in E13090 / R13090C5: '2'
## Warning: Coercing text to numeric in E13091 / R13091C5: '2'
## Warning: Coercing text to numeric in E13092 / R13092C5: '2'
## Warning: Coercing text to numeric in E13093 / R13093C5: '2'
## Warning: Coercing text to numeric in E13094 / R13094C5: '2'
## Warning: Coercing text to numeric in E13095 / R13095C5: '2'
## Warning: Coercing text to numeric in E13096 / R13096C5: '2'
## Warning: Coercing text to numeric in E13097 / R13097C5: '2'
## Warning: Coercing text to numeric in E13098 / R13098C5: '2'
## Warning: Coercing text to numeric in E13099 / R13099C5: '2'
## Warning: Coercing text to numeric in E13100 / R13100C5: '2'
## Warning: Coercing text to numeric in E13101 / R13101C5: '2'
## Warning: Coercing text to numeric in E13102 / R13102C5: '2'
## Warning: Coercing text to numeric in E13103 / R13103C5: '2'
## Warning: Coercing text to numeric in E13104 / R13104C5: '2'
## Warning: Coercing text to numeric in E13105 / R13105C5: '2'
## Warning: Coercing text to numeric in E13106 / R13106C5: '2'
## Warning: Coercing text to numeric in E13107 / R13107C5: '2'
## Warning: Coercing text to numeric in E13108 / R13108C5: '2'
## Warning: Coercing text to numeric in E13109 / R13109C5: '2'
## Warning: Coercing text to numeric in E13110 / R13110C5: '2'
## Warning: Coercing text to numeric in E13111 / R13111C5: '2'
## Warning: Coercing text to numeric in E13112 / R13112C5: '2'
## Warning: Coercing text to numeric in E13113 / R13113C5: '2'
## Warning: Coercing text to numeric in E13114 / R13114C5: '2'
## Warning: Coercing text to numeric in E13115 / R13115C5: '2'
## Warning: Coercing text to numeric in E13116 / R13116C5: '2'
## Warning: Coercing text to numeric in E13117 / R13117C5: '2'
## Warning: Coercing text to numeric in E13118 / R13118C5: '1'
## Warning: Coercing text to numeric in E13119 / R13119C5: '1'
## Warning: Coercing text to numeric in E13120 / R13120C5: '1'
## Warning: Coercing text to numeric in E13121 / R13121C5: '1'
## Warning: Coercing text to numeric in E13122 / R13122C5: '1'
## Warning: Coercing text to numeric in E13123 / R13123C5: '1'
## Warning: Coercing text to numeric in E13124 / R13124C5: '1'
## Warning: Coercing text to numeric in E13125 / R13125C5: '1'
## Warning: Coercing text to numeric in E13126 / R13126C5: '1'
## Warning: Coercing text to numeric in E13127 / R13127C5: '1'
## Warning: Coercing text to numeric in E13128 / R13128C5: '1'
## Warning: Coercing text to numeric in E13129 / R13129C5: '1'
## Warning: Coercing text to numeric in E13130 / R13130C5: '1'
## Warning: Coercing text to numeric in E13131 / R13131C5: '1'
## Warning: Coercing text to numeric in E13132 / R13132C5: '1'
## Warning: Coercing text to numeric in E13133 / R13133C5: '1'
## Warning: Coercing text to numeric in E13134 / R13134C5: '1'
## Warning: Coercing text to numeric in E13135 / R13135C5: '1'
## Warning: Coercing text to numeric in E13136 / R13136C5: '1'
## Warning: Coercing text to numeric in E13137 / R13137C5: '1'
## Warning: Coercing text to numeric in E13138 / R13138C5: '1'
## Warning: Coercing text to numeric in E13139 / R13139C5: '1'
## Warning: Coercing text to numeric in E13140 / R13140C5: '1'
## Warning: Coercing text to numeric in E13141 / R13141C5: '1'
## Warning: Coercing text to numeric in E13142 / R13142C5: '2'
## Warning: Coercing text to numeric in E13143 / R13143C5: '2'
## Warning: Coercing text to numeric in E13144 / R13144C5: '2'
## Warning: Coercing text to numeric in E13145 / R13145C5: '2'
## Warning: Coercing text to numeric in E13146 / R13146C5: '2'
## Warning: Coercing text to numeric in E13147 / R13147C5: '2'
## Warning: Coercing text to numeric in E13148 / R13148C5: '2'
## Warning: Coercing text to numeric in E13149 / R13149C5: '2'
## Warning: Coercing text to numeric in E13150 / R13150C5: '2'
## Warning: Coercing text to numeric in E13151 / R13151C5: '2'
## Warning: Coercing text to numeric in E13152 / R13152C5: '2'
## Warning: Coercing text to numeric in E13153 / R13153C5: '2'
## Warning: Coercing text to numeric in E13154 / R13154C5: '2'
## Warning: Coercing text to numeric in E13155 / R13155C5: '2'
## Warning: Coercing text to numeric in E13156 / R13156C5: '2'
## Warning: Coercing text to numeric in E13157 / R13157C5: '2'
## Warning: Coercing text to numeric in E13158 / R13158C5: '2'
## Warning: Coercing text to numeric in E13159 / R13159C5: '2'
## Warning: Coercing text to numeric in E13160 / R13160C5: '1'
## Warning: Coercing text to numeric in E13161 / R13161C5: '1'
## Warning: Coercing text to numeric in E13162 / R13162C5: '1'
## Warning: Coercing text to numeric in E13163 / R13163C5: '1'
## Warning: Coercing text to numeric in E13164 / R13164C5: '1'
## Warning: Coercing text to numeric in E13165 / R13165C5: '1'
## Warning: Coercing text to numeric in E13166 / R13166C5: '1'
## Warning: Coercing text to numeric in E13167 / R13167C5: '1'
## Warning: Coercing text to numeric in E13168 / R13168C5: '1'
## Warning: Coercing text to numeric in E13169 / R13169C5: '1'
## Warning: Coercing text to numeric in E13170 / R13170C5: '1'
## Warning: Coercing text to numeric in E13171 / R13171C5: '1'
## Warning: Coercing text to numeric in E13172 / R13172C5: '1'
## Warning: Coercing text to numeric in E13173 / R13173C5: '1'
## Warning: Coercing text to numeric in E13174 / R13174C5: '1'
## Warning: Coercing text to numeric in E13175 / R13175C5: '1'
## Warning: Coercing text to numeric in E13176 / R13176C5: '1'
## Warning: Coercing text to numeric in E13177 / R13177C5: '1'
## Warning: Coercing text to numeric in E13178 / R13178C5: '1'
## Warning: Coercing text to numeric in E13179 / R13179C5: '1'
## Warning: Coercing text to numeric in E13180 / R13180C5: '1'
## Warning: Coercing text to numeric in E13181 / R13181C5: '1'
## Warning: Coercing text to numeric in E13182 / R13182C5: '1'
## Warning: Coercing text to numeric in E13183 / R13183C5: '1'
## Warning: Coercing text to numeric in E13184 / R13184C5: '2'
## Warning: Coercing text to numeric in E13185 / R13185C5: '2'
## Warning: Coercing text to numeric in E13186 / R13186C5: '2'
## Warning: Coercing text to numeric in E13187 / R13187C5: '2'
## Warning: Coercing text to numeric in E13188 / R13188C5: '2'
## Warning: Coercing text to numeric in E13189 / R13189C5: '2'
## Warning: Coercing text to numeric in E13190 / R13190C5: '1'
## Warning: Coercing text to numeric in E13191 / R13191C5: '1'
## Warning: Coercing text to numeric in E13192 / R13192C5: '1'
## Warning: Coercing text to numeric in E13193 / R13193C5: '1'
## Warning: Coercing text to numeric in E13194 / R13194C5: '1'
## Warning: Coercing text to numeric in E13195 / R13195C5: '1'
## Warning: Coercing text to numeric in E13196 / R13196C5: '1'
## Warning: Coercing text to numeric in E13197 / R13197C5: '1'
## Warning: Coercing text to numeric in E13198 / R13198C5: '1'
## Warning: Coercing text to numeric in E13199 / R13199C5: '1'
## Warning: Coercing text to numeric in E13200 / R13200C5: '1'
## Warning: Coercing text to numeric in E13201 / R13201C5: '1'
## Warning: Coercing text to numeric in E13202 / R13202C5: '1'
## Warning: Coercing text to numeric in E13203 / R13203C5: '1'
## Warning: Coercing text to numeric in E13204 / R13204C5: '1'
## Warning: Coercing text to numeric in E13205 / R13205C5: '1'
## Warning: Coercing text to numeric in E13206 / R13206C5: '1'
## Warning: Coercing text to numeric in E13207 / R13207C5: '1'
## Warning: Coercing text to numeric in E13208 / R13208C5: '1'
## Warning: Coercing text to numeric in E13209 / R13209C5: '1'
## Warning: Coercing text to numeric in E13210 / R13210C5: '1'
## Warning: Coercing text to numeric in E13211 / R13211C5: '1'
## Warning: Coercing text to numeric in E13212 / R13212C5: '1'
## Warning: Coercing text to numeric in E13213 / R13213C5: '1'
## Warning: Coercing text to numeric in E13214 / R13214C5: '2'
## Warning: Coercing text to numeric in E13215 / R13215C5: '2'
## Warning: Coercing text to numeric in E13216 / R13216C5: '2'
## Warning: Coercing text to numeric in E13217 / R13217C5: '2'
## Warning: Coercing text to numeric in E13218 / R13218C5: '2'
## Warning: Coercing text to numeric in E13219 / R13219C5: '2'
## Warning: Coercing text to numeric in E13220 / R13220C5: '1'
## Warning: Coercing text to numeric in E13221 / R13221C5: '1'
## Warning: Coercing text to numeric in E13222 / R13222C5: '1'
## Warning: Coercing text to numeric in E13223 / R13223C5: '1'
## Warning: Coercing text to numeric in E13224 / R13224C5: '1'
## Warning: Coercing text to numeric in E13225 / R13225C5: '1'
## Warning: Coercing text to numeric in E13226 / R13226C5: '1'
## Warning: Coercing text to numeric in E13227 / R13227C5: '1'
## Warning: Coercing text to numeric in E13228 / R13228C5: '1'
## Warning: Coercing text to numeric in E13229 / R13229C5: '1'
## Warning: Coercing text to numeric in E13230 / R13230C5: '1'
## Warning: Coercing text to numeric in E13231 / R13231C5: '1'
## Warning: Coercing text to numeric in E13232 / R13232C5: '2'
## Warning: Coercing text to numeric in E13233 / R13233C5: '2'
## Warning: Coercing text to numeric in E13234 / R13234C5: '2'
## Warning: Coercing text to numeric in E13235 / R13235C5: '2'
## Warning: Coercing text to numeric in E13236 / R13236C5: '2'
## Warning: Coercing text to numeric in E13237 / R13237C5: '2'
## Warning: Coercing text to numeric in E13238 / R13238C5: '1'
## Warning: Coercing text to numeric in E13239 / R13239C5: '1'
## Warning: Coercing text to numeric in E13240 / R13240C5: '1'
## Warning: Coercing text to numeric in E13241 / R13241C5: '1'
## Warning: Coercing text to numeric in E13242 / R13242C5: '1'
## Warning: Coercing text to numeric in E13243 / R13243C5: '1'
## Warning: Coercing text to numeric in E13244 / R13244C5: '2'
## Warning: Coercing text to numeric in E13245 / R13245C5: '2'
## Warning: Coercing text to numeric in E13246 / R13246C5: '2'
## Warning: Coercing text to numeric in E13247 / R13247C5: '2'
## Warning: Coercing text to numeric in E13248 / R13248C5: '2'
## Warning: Coercing text to numeric in E13249 / R13249C5: '2'
## Warning: Coercing text to numeric in E13250 / R13250C5: '1'
## Warning: Coercing text to numeric in E13251 / R13251C5: '1'
## Warning: Coercing text to numeric in E13252 / R13252C5: '1'
## Warning: Coercing text to numeric in E13253 / R13253C5: '1'
## Warning: Coercing text to numeric in E13254 / R13254C5: '1'
## Warning: Coercing text to numeric in E13255 / R13255C5: '1'
## Warning: Coercing text to numeric in E13256 / R13256C5: '2'
## Warning: Coercing text to numeric in E13257 / R13257C5: '2'
## Warning: Coercing text to numeric in E13258 / R13258C5: '2'
## Warning: Coercing text to numeric in E13259 / R13259C5: '2'
## Warning: Coercing text to numeric in E13260 / R13260C5: '2'
## Warning: Coercing text to numeric in E13261 / R13261C5: '2'
## Warning: Coercing text to numeric in E13262 / R13262C5: '1'
## Warning: Coercing text to numeric in E13263 / R13263C5: '1'
## Warning: Coercing text to numeric in E13264 / R13264C5: '1'
## Warning: Coercing text to numeric in E13265 / R13265C5: '1'
## Warning: Coercing text to numeric in E13266 / R13266C5: '1'
## Warning: Coercing text to numeric in E13267 / R13267C5: '1'
## Warning: Coercing text to numeric in E13268 / R13268C5: '1'
## Warning: Coercing text to numeric in E13269 / R13269C5: '1'
## Warning: Coercing text to numeric in E13270 / R13270C5: '1'
## Warning: Coercing text to numeric in E13271 / R13271C5: '1'
## Warning: Coercing text to numeric in E13272 / R13272C5: '1'
## Warning: Coercing text to numeric in E13273 / R13273C5: '1'
## Warning: Coercing text to numeric in E13274 / R13274C5: '2'
## Warning: Coercing text to numeric in E13275 / R13275C5: '2'
## Warning: Coercing text to numeric in E13276 / R13276C5: '2'
## Warning: Coercing text to numeric in E13277 / R13277C5: '2'
## Warning: Coercing text to numeric in E13278 / R13278C5: '2'
## Warning: Coercing text to numeric in E13279 / R13279C5: '2'
## Warning: Coercing text to numeric in E13280 / R13280C5: '2'
## Warning: Coercing text to numeric in E13281 / R13281C5: '2'
## Warning: Coercing text to numeric in E13282 / R13282C5: '2'
## Warning: Coercing text to numeric in E13283 / R13283C5: '2'
## Warning: Coercing text to numeric in E13284 / R13284C5: '2'
## Warning: Coercing text to numeric in E13285 / R13285C5: '2'
## Warning: Coercing text to numeric in E13286 / R13286C5: '2'
## Warning: Coercing text to numeric in E13287 / R13287C5: '2'
## Warning: Coercing text to numeric in E13288 / R13288C5: '2'
## Warning: Coercing text to numeric in E13289 / R13289C5: '2'
## Warning: Coercing text to numeric in E13290 / R13290C5: '2'
## Warning: Coercing text to numeric in E13291 / R13291C5: '2'
## Warning: Coercing text to numeric in E13292 / R13292C5: '1'
## Warning: Coercing text to numeric in E13293 / R13293C5: '1'
## Warning: Coercing text to numeric in E13294 / R13294C5: '1'
## Warning: Coercing text to numeric in E13295 / R13295C5: '1'
## Warning: Coercing text to numeric in E13296 / R13296C5: '1'
## Warning: Coercing text to numeric in E13297 / R13297C5: '1'
## Warning: Coercing text to numeric in E13298 / R13298C5: '1'
## Warning: Coercing text to numeric in E13299 / R13299C5: '1'
## Warning: Coercing text to numeric in E13300 / R13300C5: '1'
## Warning: Coercing text to numeric in E13301 / R13301C5: '1'
## Warning: Coercing text to numeric in E13302 / R13302C5: '1'
## Warning: Coercing text to numeric in E13303 / R13303C5: '1'
## Warning: Coercing text to numeric in E13304 / R13304C5: '2'
## Warning: Coercing text to numeric in E13305 / R13305C5: '2'
## Warning: Coercing text to numeric in E13306 / R13306C5: '2'
## Warning: Coercing text to numeric in E13307 / R13307C5: '2'
## Warning: Coercing text to numeric in E13308 / R13308C5: '2'
## Warning: Coercing text to numeric in E13309 / R13309C5: '2'
## Warning: Coercing text to numeric in E13310 / R13310C5: '2'
## Warning: Coercing text to numeric in E13311 / R13311C5: '2'
## Warning: Coercing text to numeric in E13312 / R13312C5: '2'
## Warning: Coercing text to numeric in E13313 / R13313C5: '2'
## Warning: Coercing text to numeric in E13314 / R13314C5: '2'
## Warning: Coercing text to numeric in E13315 / R13315C5: '2'
## Warning: Coercing text to numeric in E13316 / R13316C5: '1'
## Warning: Coercing text to numeric in E13317 / R13317C5: '1'
## Warning: Coercing text to numeric in E13318 / R13318C5: '1'
## Warning: Coercing text to numeric in E13319 / R13319C5: '1'
## Warning: Coercing text to numeric in E13320 / R13320C5: '1'
## Warning: Coercing text to numeric in E13321 / R13321C5: '1'
## Warning: Coercing text to numeric in E13322 / R13322C5: '2'
## Warning: Coercing text to numeric in E13323 / R13323C5: '2'
## Warning: Coercing text to numeric in E13324 / R13324C5: '2'
## Warning: Coercing text to numeric in E13325 / R13325C5: '2'
## Warning: Coercing text to numeric in E13326 / R13326C5: '2'
## Warning: Coercing text to numeric in E13327 / R13327C5: '2'
## Warning: Coercing text to numeric in E13328 / R13328C5: '1'
## Warning: Coercing text to numeric in E13329 / R13329C5: '1'
## Warning: Coercing text to numeric in E13330 / R13330C5: '1'
## Warning: Coercing text to numeric in E13331 / R13331C5: '1'
## Warning: Coercing text to numeric in E13332 / R13332C5: '1'
## Warning: Coercing text to numeric in E13333 / R13333C5: '1'
## Warning: Coercing text to numeric in E13334 / R13334C5: '1'
## Warning: Coercing text to numeric in E13335 / R13335C5: '1'
## Warning: Coercing text to numeric in E13336 / R13336C5: '1'
## Warning: Coercing text to numeric in E13337 / R13337C5: '1'
## Warning: Coercing text to numeric in E13338 / R13338C5: '1'
## Warning: Coercing text to numeric in E13339 / R13339C5: '1'
## Warning: Coercing text to numeric in E13340 / R13340C5: '1'
## Warning: Coercing text to numeric in E13341 / R13341C5: '1'
## Warning: Coercing text to numeric in E13342 / R13342C5: '1'
## Warning: Coercing text to numeric in E13343 / R13343C5: '1'
## Warning: Coercing text to numeric in E13344 / R13344C5: '1'
## Warning: Coercing text to numeric in E13345 / R13345C5: '1'
## Warning: Coercing text to numeric in E13346 / R13346C5: '1'
## Warning: Coercing text to numeric in E13347 / R13347C5: '1'
## Warning: Coercing text to numeric in E13348 / R13348C5: '1'
## Warning: Coercing text to numeric in E13349 / R13349C5: '1'
## Warning: Coercing text to numeric in E13350 / R13350C5: '1'
## Warning: Coercing text to numeric in E13351 / R13351C5: '1'
## Warning: Coercing text to numeric in E13352 / R13352C5: '2'
## Warning: Coercing text to numeric in E13353 / R13353C5: '2'
## Warning: Coercing text to numeric in E13354 / R13354C5: '2'
## Warning: Coercing text to numeric in E13355 / R13355C5: '2'
## Warning: Coercing text to numeric in E13356 / R13356C5: '2'
## Warning: Coercing text to numeric in E13357 / R13357C5: '2'
## Warning: Coercing text to numeric in E13358 / R13358C5: '1'
## Warning: Coercing text to numeric in E13359 / R13359C5: '1'
## Warning: Coercing text to numeric in E13360 / R13360C5: '1'
## Warning: Coercing text to numeric in E13361 / R13361C5: '1'
## Warning: Coercing text to numeric in E13362 / R13362C5: '1'
## Warning: Coercing text to numeric in E13363 / R13363C5: '1'
## Warning: Coercing text to numeric in E13364 / R13364C5: '1'
## Warning: Coercing text to numeric in E13365 / R13365C5: '1'
## Warning: Coercing text to numeric in E13366 / R13366C5: '1'
## Warning: Coercing text to numeric in E13367 / R13367C5: '1'
## Warning: Coercing text to numeric in E13368 / R13368C5: '1'
## Warning: Coercing text to numeric in E13369 / R13369C5: '1'
## Warning: Coercing text to numeric in E13370 / R13370C5: '1'
## Warning: Coercing text to numeric in E13371 / R13371C5: '1'
## Warning: Coercing text to numeric in E13372 / R13372C5: '1'
## Warning: Coercing text to numeric in E13373 / R13373C5: '1'
## Warning: Coercing text to numeric in E13374 / R13374C5: '1'
## Warning: Coercing text to numeric in E13375 / R13375C5: '1'
## Warning: Coercing text to numeric in E13376 / R13376C5: '1'
## Warning: Coercing text to numeric in E13377 / R13377C5: '1'
## Warning: Coercing text to numeric in E13378 / R13378C5: '1'
## Warning: Coercing text to numeric in E13379 / R13379C5: '1'
## Warning: Coercing text to numeric in E13380 / R13380C5: '1'
## Warning: Coercing text to numeric in E13381 / R13381C5: '1'
## Warning: Coercing text to numeric in E13382 / R13382C5: '1'
## Warning: Coercing text to numeric in E13383 / R13383C5: '1'
## Warning: Coercing text to numeric in E13384 / R13384C5: '1'
## Warning: Coercing text to numeric in E13385 / R13385C5: '1'
## Warning: Coercing text to numeric in E13386 / R13386C5: '1'
## Warning: Coercing text to numeric in E13387 / R13387C5: '1'
## Warning: Coercing text to numeric in E13388 / R13388C5: '2'
## Warning: Coercing text to numeric in E13389 / R13389C5: '2'
## Warning: Coercing text to numeric in E13390 / R13390C5: '2'
## Warning: Coercing text to numeric in E13391 / R13391C5: '2'
## Warning: Coercing text to numeric in E13392 / R13392C5: '2'
## Warning: Coercing text to numeric in E13393 / R13393C5: '2'
## Warning: Coercing text to numeric in E13394 / R13394C5: '1'
## Warning: Coercing text to numeric in E13395 / R13395C5: '1'
## Warning: Coercing text to numeric in E13396 / R13396C5: '1'
## Warning: Coercing text to numeric in E13397 / R13397C5: '1'
## Warning: Coercing text to numeric in E13398 / R13398C5: '1'
## Warning: Coercing text to numeric in E13399 / R13399C5: '1'
## Warning: Coercing text to numeric in E13400 / R13400C5: '1'
## Warning: Coercing text to numeric in E13401 / R13401C5: '1'
## Warning: Coercing text to numeric in E13402 / R13402C5: '1'
## Warning: Coercing text to numeric in E13403 / R13403C5: '1'
## Warning: Coercing text to numeric in E13404 / R13404C5: '1'
## Warning: Coercing text to numeric in E13405 / R13405C5: '1'
## Warning: Coercing text to numeric in E13406 / R13406C5: '1'
## Warning: Coercing text to numeric in E13407 / R13407C5: '1'
## Warning: Coercing text to numeric in E13408 / R13408C5: '1'
## Warning: Coercing text to numeric in E13409 / R13409C5: '1'
## Warning: Coercing text to numeric in E13410 / R13410C5: '1'
## Warning: Coercing text to numeric in E13411 / R13411C5: '1'
## Warning: Coercing text to numeric in E13412 / R13412C5: '1'
## Warning: Coercing text to numeric in E13413 / R13413C5: '1'
## Warning: Coercing text to numeric in E13414 / R13414C5: '1'
## Warning: Coercing text to numeric in E13415 / R13415C5: '1'
## Warning: Coercing text to numeric in E13416 / R13416C5: '1'
## Warning: Coercing text to numeric in E13417 / R13417C5: '1'
## Warning: Coercing text to numeric in E13418 / R13418C5: '1'
## Warning: Coercing text to numeric in E13419 / R13419C5: '1'
## Warning: Coercing text to numeric in E13420 / R13420C5: '1'
## Warning: Coercing text to numeric in E13421 / R13421C5: '1'
## Warning: Coercing text to numeric in E13422 / R13422C5: '1'
## Warning: Coercing text to numeric in E13423 / R13423C5: '1'
## Warning: Coercing text to numeric in E13424 / R13424C5: '1'
## Warning: Coercing text to numeric in E13425 / R13425C5: '1'
## Warning: Coercing text to numeric in E13426 / R13426C5: '1'
## Warning: Coercing text to numeric in E13427 / R13427C5: '1'
## Warning: Coercing text to numeric in E13428 / R13428C5: '1'
## Warning: Coercing text to numeric in E13429 / R13429C5: '1'
## Warning: Coercing text to numeric in E13430 / R13430C5: '2'
## Warning: Coercing text to numeric in E13431 / R13431C5: '2'
## Warning: Coercing text to numeric in E13432 / R13432C5: '2'
## Warning: Coercing text to numeric in E13433 / R13433C5: '2'
## Warning: Coercing text to numeric in E13434 / R13434C5: '2'
## Warning: Coercing text to numeric in E13435 / R13435C5: '2'
## Warning: Coercing text to numeric in E13436 / R13436C5: '2'
## Warning: Coercing text to numeric in E13437 / R13437C5: '2'
## Warning: Coercing text to numeric in E13438 / R13438C5: '2'
## Warning: Coercing text to numeric in E13439 / R13439C5: '2'
## Warning: Coercing text to numeric in E13440 / R13440C5: '2'
## Warning: Coercing text to numeric in E13441 / R13441C5: '2'
## Warning: Coercing text to numeric in E13442 / R13442C5: '2'
## Warning: Coercing text to numeric in E13443 / R13443C5: '2'
## Warning: Coercing text to numeric in E13444 / R13444C5: '2'
## Warning: Coercing text to numeric in E13445 / R13445C5: '2'
## Warning: Coercing text to numeric in E13446 / R13446C5: '2'
## Warning: Coercing text to numeric in E13447 / R13447C5: '2'
## Warning: Coercing text to numeric in E13448 / R13448C5: '2'
## Warning: Coercing text to numeric in E13449 / R13449C5: '2'
## Warning: Coercing text to numeric in E13450 / R13450C5: '2'
## Warning: Coercing text to numeric in E13451 / R13451C5: '2'
## Warning: Coercing text to numeric in E13452 / R13452C5: '2'
## Warning: Coercing text to numeric in E13453 / R13453C5: '2'
## Warning: Coercing text to numeric in E13454 / R13454C5: '2'
## Warning: Coercing text to numeric in E13455 / R13455C5: '2'
## Warning: Coercing text to numeric in E13456 / R13456C5: '2'
## Warning: Coercing text to numeric in E13457 / R13457C5: '2'
## Warning: Coercing text to numeric in E13458 / R13458C5: '2'
## Warning: Coercing text to numeric in E13459 / R13459C5: '2'
## Warning: Coercing text to numeric in E13460 / R13460C5: '1'
## Warning: Coercing text to numeric in E13461 / R13461C5: '1'
## Warning: Coercing text to numeric in E13462 / R13462C5: '1'
## Warning: Coercing text to numeric in E13463 / R13463C5: '1'
## Warning: Coercing text to numeric in E13464 / R13464C5: '1'
## Warning: Coercing text to numeric in E13465 / R13465C5: '1'
## Warning: Coercing text to numeric in E13466 / R13466C5: '2'
## Warning: Coercing text to numeric in E13467 / R13467C5: '2'
## Warning: Coercing text to numeric in E13468 / R13468C5: '2'
## Warning: Coercing text to numeric in E13469 / R13469C5: '2'
## Warning: Coercing text to numeric in E13470 / R13470C5: '2'
## Warning: Coercing text to numeric in E13471 / R13471C5: '2'
## Warning: Coercing text to numeric in E13472 / R13472C5: '1'
## Warning: Coercing text to numeric in E13473 / R13473C5: '1'
## Warning: Coercing text to numeric in E13474 / R13474C5: '1'
## Warning: Coercing text to numeric in E13475 / R13475C5: '1'
## Warning: Coercing text to numeric in E13476 / R13476C5: '1'
## Warning: Coercing text to numeric in E13477 / R13477C5: '1'
## Warning: Coercing text to numeric in E13478 / R13478C5: '1'
## Warning: Coercing text to numeric in E13479 / R13479C5: '1'
## Warning: Coercing text to numeric in E13480 / R13480C5: '1'
## Warning: Coercing text to numeric in E13481 / R13481C5: '1'
## Warning: Coercing text to numeric in E13482 / R13482C5: '1'
## Warning: Coercing text to numeric in E13483 / R13483C5: '1'
## Warning: Coercing text to numeric in E13484 / R13484C5: '1'
## Warning: Coercing text to numeric in E13485 / R13485C5: '1'
## Warning: Coercing text to numeric in E13486 / R13486C5: '1'
## Warning: Coercing text to numeric in E13487 / R13487C5: '1'
## Warning: Coercing text to numeric in E13488 / R13488C5: '1'
## Warning: Coercing text to numeric in E13489 / R13489C5: '1'
## Warning: Coercing text to numeric in E13490 / R13490C5: '1'
## Warning: Coercing text to numeric in E13491 / R13491C5: '1'
## Warning: Coercing text to numeric in E13492 / R13492C5: '1'
## Warning: Coercing text to numeric in E13493 / R13493C5: '1'
## Warning: Coercing text to numeric in E13494 / R13494C5: '1'
## Warning: Coercing text to numeric in E13495 / R13495C5: '1'
## Warning: Coercing text to numeric in E13496 / R13496C5: '1'
## Warning: Coercing text to numeric in E13497 / R13497C5: '1'
## Warning: Coercing text to numeric in E13498 / R13498C5: '1'
## Warning: Coercing text to numeric in E13499 / R13499C5: '1'
## Warning: Coercing text to numeric in E13500 / R13500C5: '1'
## Warning: Coercing text to numeric in E13501 / R13501C5: '1'
## Warning: Coercing text to numeric in E13502 / R13502C5: '2'
## Warning: Coercing text to numeric in E13503 / R13503C5: '2'
## Warning: Coercing text to numeric in E13504 / R13504C5: '2'
## Warning: Coercing text to numeric in E13505 / R13505C5: '2'
## Warning: Coercing text to numeric in E13506 / R13506C5: '2'
## Warning: Coercing text to numeric in E13507 / R13507C5: '2'
## Warning: Coercing text to numeric in E13508 / R13508C5: '2'
## Warning: Coercing text to numeric in E13509 / R13509C5: '2'
## Warning: Coercing text to numeric in E13510 / R13510C5: '2'
## Warning: Coercing text to numeric in E13511 / R13511C5: '2'
## Warning: Coercing text to numeric in E13512 / R13512C5: '2'
## Warning: Coercing text to numeric in E13513 / R13513C5: '2'
## Warning: Coercing text to numeric in E13514 / R13514C5: '2'
## Warning: Coercing text to numeric in E13515 / R13515C5: '2'
## Warning: Coercing text to numeric in E13516 / R13516C5: '2'
## Warning: Coercing text to numeric in E13517 / R13517C5: '2'
## Warning: Coercing text to numeric in E13518 / R13518C5: '2'
## Warning: Coercing text to numeric in E13519 / R13519C5: '2'
## Warning: Coercing text to numeric in E13520 / R13520C5: '2'
## Warning: Coercing text to numeric in E13521 / R13521C5: '2'
## Warning: Coercing text to numeric in E13522 / R13522C5: '2'
## Warning: Coercing text to numeric in E13523 / R13523C5: '2'
## Warning: Coercing text to numeric in E13524 / R13524C5: '2'
## Warning: Coercing text to numeric in E13525 / R13525C5: '2'
## Warning: Coercing text to numeric in E13526 / R13526C5: '1'
## Warning: Coercing text to numeric in E13527 / R13527C5: '1'
## Warning: Coercing text to numeric in E13528 / R13528C5: '1'
## Warning: Coercing text to numeric in E13529 / R13529C5: '1'
## Warning: Coercing text to numeric in E13530 / R13530C5: '1'
## Warning: Coercing text to numeric in E13531 / R13531C5: '1'
## Warning: Coercing text to numeric in E13532 / R13532C5: '1'
## Warning: Coercing text to numeric in E13533 / R13533C5: '1'
## Warning: Coercing text to numeric in E13534 / R13534C5: '1'
## Warning: Coercing text to numeric in E13535 / R13535C5: '1'
## Warning: Coercing text to numeric in E13536 / R13536C5: '1'
## Warning: Coercing text to numeric in E13537 / R13537C5: '1'
## Warning: Coercing text to numeric in E13538 / R13538C5: '1'
## Warning: Coercing text to numeric in E13539 / R13539C5: '1'
## Warning: Coercing text to numeric in E13540 / R13540C5: '1'
## Warning: Coercing text to numeric in E13541 / R13541C5: '1'
## Warning: Coercing text to numeric in E13542 / R13542C5: '1'
## Warning: Coercing text to numeric in E13543 / R13543C5: '1'
## Warning: Coercing text to numeric in E13544 / R13544C5: '2'
## Warning: Coercing text to numeric in E13545 / R13545C5: '2'
## Warning: Coercing text to numeric in E13546 / R13546C5: '2'
## Warning: Coercing text to numeric in E13547 / R13547C5: '2'
## Warning: Coercing text to numeric in E13548 / R13548C5: '2'
## Warning: Coercing text to numeric in E13549 / R13549C5: '2'
## Warning: Coercing text to numeric in E13550 / R13550C5: '2'
## Warning: Coercing text to numeric in E13551 / R13551C5: '2'
## Warning: Coercing text to numeric in E13552 / R13552C5: '2'
## Warning: Coercing text to numeric in E13553 / R13553C5: '2'
## Warning: Coercing text to numeric in E13554 / R13554C5: '2'
## Warning: Coercing text to numeric in E13555 / R13555C5: '2'
## Warning: Coercing text to numeric in E13556 / R13556C5: '1'
## Warning: Coercing text to numeric in E13557 / R13557C5: '1'
## Warning: Coercing text to numeric in E13558 / R13558C5: '1'
## Warning: Coercing text to numeric in E13559 / R13559C5: '1'
## Warning: Coercing text to numeric in E13560 / R13560C5: '1'
## Warning: Coercing text to numeric in E13561 / R13561C5: '1'
## Warning: Coercing text to numeric in E13562 / R13562C5: '2'
## Warning: Coercing text to numeric in E13563 / R13563C5: '2'
## Warning: Coercing text to numeric in E13564 / R13564C5: '2'
## Warning: Coercing text to numeric in E13565 / R13565C5: '2'
## Warning: Coercing text to numeric in E13566 / R13566C5: '2'
## Warning: Coercing text to numeric in E13567 / R13567C5: '2'
## Warning: Coercing text to numeric in E13568 / R13568C5: '1'
## Warning: Coercing text to numeric in E13569 / R13569C5: '1'
## Warning: Coercing text to numeric in E13570 / R13570C5: '1'
## Warning: Coercing text to numeric in E13571 / R13571C5: '1'
## Warning: Coercing text to numeric in E13572 / R13572C5: '1'
## Warning: Coercing text to numeric in E13573 / R13573C5: '1'
## Warning: Coercing text to numeric in E13574 / R13574C5: '2'
## Warning: Coercing text to numeric in E13575 / R13575C5: '2'
## Warning: Coercing text to numeric in E13576 / R13576C5: '2'
## Warning: Coercing text to numeric in E13577 / R13577C5: '2'
## Warning: Coercing text to numeric in E13578 / R13578C5: '2'
## Warning: Coercing text to numeric in E13579 / R13579C5: '2'
## Warning: Coercing text to numeric in E13580 / R13580C5: '2'
## Warning: Coercing text to numeric in E13581 / R13581C5: '2'
## Warning: Coercing text to numeric in E13582 / R13582C5: '2'
## Warning: Coercing text to numeric in E13583 / R13583C5: '2'
## Warning: Coercing text to numeric in E13584 / R13584C5: '2'
## Warning: Coercing text to numeric in E13585 / R13585C5: '2'
## Warning: Coercing text to numeric in E13586 / R13586C5: '1'
## Warning: Coercing text to numeric in E13587 / R13587C5: '1'
## Warning: Coercing text to numeric in E13588 / R13588C5: '1'
## Warning: Coercing text to numeric in E13589 / R13589C5: '1'
## Warning: Coercing text to numeric in E13590 / R13590C5: '1'
## Warning: Coercing text to numeric in E13591 / R13591C5: '1'
## Warning: Coercing text to numeric in E13592 / R13592C5: '1'
## Warning: Coercing text to numeric in E13593 / R13593C5: '1'
## Warning: Coercing text to numeric in E13594 / R13594C5: '1'
## Warning: Coercing text to numeric in E13595 / R13595C5: '1'
## Warning: Coercing text to numeric in E13596 / R13596C5: '1'
## Warning: Coercing text to numeric in E13597 / R13597C5: '1'
## Warning: Coercing text to numeric in E13598 / R13598C5: '2'
## Warning: Coercing text to numeric in E13599 / R13599C5: '2'
## Warning: Coercing text to numeric in E13600 / R13600C5: '2'
## Warning: Coercing text to numeric in E13601 / R13601C5: '2'
## Warning: Coercing text to numeric in E13602 / R13602C5: '2'
## Warning: Coercing text to numeric in E13603 / R13603C5: '2'
## Warning: Coercing text to numeric in E13604 / R13604C5: '1'
## Warning: Coercing text to numeric in E13605 / R13605C5: '1'
## Warning: Coercing text to numeric in E13606 / R13606C5: '1'
## Warning: Coercing text to numeric in E13607 / R13607C5: '1'
## Warning: Coercing text to numeric in E13608 / R13608C5: '1'
## Warning: Coercing text to numeric in E13609 / R13609C5: '1'
## Warning: Coercing text to numeric in E13610 / R13610C5: '2'
## Warning: Coercing text to numeric in E13611 / R13611C5: '2'
## Warning: Coercing text to numeric in E13612 / R13612C5: '2'
## Warning: Coercing text to numeric in E13613 / R13613C5: '2'
## Warning: Coercing text to numeric in E13614 / R13614C5: '2'
## Warning: Coercing text to numeric in E13615 / R13615C5: '2'
## Warning: Coercing text to numeric in E13616 / R13616C5: '1'
## Warning: Coercing text to numeric in E13617 / R13617C5: '1'
## Warning: Coercing text to numeric in E13618 / R13618C5: '1'
## Warning: Coercing text to numeric in E13619 / R13619C5: '1'
## Warning: Coercing text to numeric in E13620 / R13620C5: '1'
## Warning: Coercing text to numeric in E13621 / R13621C5: '1'
## Warning: Coercing text to numeric in E13622 / R13622C5: '2'
## Warning: Coercing text to numeric in E13623 / R13623C5: '2'
## Warning: Coercing text to numeric in E13624 / R13624C5: '2'
## Warning: Coercing text to numeric in E13625 / R13625C5: '2'
## Warning: Coercing text to numeric in E13626 / R13626C5: '2'
## Warning: Coercing text to numeric in E13627 / R13627C5: '2'
## Warning: Coercing text to numeric in E13628 / R13628C5: '1'
## Warning: Coercing text to numeric in E13629 / R13629C5: '1'
## Warning: Coercing text to numeric in E13630 / R13630C5: '1'
## Warning: Coercing text to numeric in E13631 / R13631C5: '1'
## Warning: Coercing text to numeric in E13632 / R13632C5: '1'
## Warning: Coercing text to numeric in E13633 / R13633C5: '1'
## Warning: Coercing text to numeric in E13634 / R13634C5: '2'
## Warning: Coercing text to numeric in E13635 / R13635C5: '2'
## Warning: Coercing text to numeric in E13636 / R13636C5: '2'
## Warning: Coercing text to numeric in E13637 / R13637C5: '2'
## Warning: Coercing text to numeric in E13638 / R13638C5: '2'
## Warning: Coercing text to numeric in E13639 / R13639C5: '2'
## Warning: Coercing text to numeric in E13640 / R13640C5: '2'
## Warning: Coercing text to numeric in E13641 / R13641C5: '2'
## Warning: Coercing text to numeric in E13642 / R13642C5: '2'
## Warning: Coercing text to numeric in E13643 / R13643C5: '2'
## Warning: Coercing text to numeric in E13644 / R13644C5: '2'
## Warning: Coercing text to numeric in E13645 / R13645C5: '2'
## Warning: Coercing text to numeric in E13646 / R13646C5: '1'
## Warning: Coercing text to numeric in E13647 / R13647C5: '1'
## Warning: Coercing text to numeric in E13648 / R13648C5: '1'
## Warning: Coercing text to numeric in E13649 / R13649C5: '1'
## Warning: Coercing text to numeric in E13650 / R13650C5: '1'
## Warning: Coercing text to numeric in E13651 / R13651C5: '1'
## Warning: Coercing text to numeric in E13652 / R13652C5: '1'
## Warning: Coercing text to numeric in E13653 / R13653C5: '1'
## Warning: Coercing text to numeric in E13654 / R13654C5: '1'
## Warning: Coercing text to numeric in E13655 / R13655C5: '1'
## Warning: Coercing text to numeric in E13656 / R13656C5: '1'
## Warning: Coercing text to numeric in E13657 / R13657C5: '1'
## Warning: Coercing text to numeric in E13658 / R13658C5: '2'
## Warning: Coercing text to numeric in E13659 / R13659C5: '2'
## Warning: Coercing text to numeric in E13660 / R13660C5: '2'
## Warning: Coercing text to numeric in E13661 / R13661C5: '2'
## Warning: Coercing text to numeric in E13662 / R13662C5: '2'
## Warning: Coercing text to numeric in E13663 / R13663C5: '2'
## Warning: Coercing text to numeric in E13664 / R13664C5: '1'
## Warning: Coercing text to numeric in E13665 / R13665C5: '1'
## Warning: Coercing text to numeric in E13666 / R13666C5: '1'
## Warning: Coercing text to numeric in E13667 / R13667C5: '1'
## Warning: Coercing text to numeric in E13668 / R13668C5: '1'
## Warning: Coercing text to numeric in E13669 / R13669C5: '1'
## Warning: Coercing text to numeric in E13670 / R13670C5: '2'
## Warning: Coercing text to numeric in E13671 / R13671C5: '2'
## Warning: Coercing text to numeric in E13672 / R13672C5: '2'
## Warning: Coercing text to numeric in E13673 / R13673C5: '2'
## Warning: Coercing text to numeric in E13674 / R13674C5: '2'
## Warning: Coercing text to numeric in E13675 / R13675C5: '2'
## Warning: Coercing text to numeric in E13676 / R13676C5: '2'
## Warning: Coercing text to numeric in E13677 / R13677C5: '2'
## Warning: Coercing text to numeric in E13678 / R13678C5: '2'
## Warning: Coercing text to numeric in E13679 / R13679C5: '2'
## Warning: Coercing text to numeric in E13680 / R13680C5: '2'
## Warning: Coercing text to numeric in E13681 / R13681C5: '2'
## Warning: Coercing text to numeric in E13682 / R13682C5: '2'
## Warning: Coercing text to numeric in E13683 / R13683C5: '2'
## Warning: Coercing text to numeric in E13684 / R13684C5: '2'
## Warning: Coercing text to numeric in E13685 / R13685C5: '2'
## Warning: Coercing text to numeric in E13686 / R13686C5: '2'
## Warning: Coercing text to numeric in E13687 / R13687C5: '2'
## Warning: Coercing text to numeric in E13688 / R13688C5: '1'
## Warning: Coercing text to numeric in E13689 / R13689C5: '1'
## Warning: Coercing text to numeric in E13690 / R13690C5: '1'
## Warning: Coercing text to numeric in E13691 / R13691C5: '1'
## Warning: Coercing text to numeric in E13692 / R13692C5: '1'
## Warning: Coercing text to numeric in E13693 / R13693C5: '1'
## Warning: Coercing text to numeric in E13694 / R13694C5: '1'
## Warning: Coercing text to numeric in E13695 / R13695C5: '1'
## Warning: Coercing text to numeric in E13696 / R13696C5: '1'
## Warning: Coercing text to numeric in E13697 / R13697C5: '1'
## Warning: Coercing text to numeric in E13698 / R13698C5: '1'
## Warning: Coercing text to numeric in E13699 / R13699C5: '1'
## Warning: Coercing text to numeric in E13700 / R13700C5: '2'
## Warning: Coercing text to numeric in E13701 / R13701C5: '2'
## Warning: Coercing text to numeric in E13702 / R13702C5: '2'
## Warning: Coercing text to numeric in E13703 / R13703C5: '2'
## Warning: Coercing text to numeric in E13704 / R13704C5: '2'
## Warning: Coercing text to numeric in E13705 / R13705C5: '2'
## Warning: Coercing text to numeric in E13706 / R13706C5: '1'
## Warning: Coercing text to numeric in E13707 / R13707C5: '1'
## Warning: Coercing text to numeric in E13708 / R13708C5: '1'
## Warning: Coercing text to numeric in E13709 / R13709C5: '1'
## Warning: Coercing text to numeric in E13710 / R13710C5: '1'
## Warning: Coercing text to numeric in E13711 / R13711C5: '1'
## Warning: Coercing text to numeric in E13712 / R13712C5: '1'
## Warning: Coercing text to numeric in E13713 / R13713C5: '1'
## Warning: Coercing text to numeric in E13714 / R13714C5: '1'
## Warning: Coercing text to numeric in E13715 / R13715C5: '1'
## Warning: Coercing text to numeric in E13716 / R13716C5: '1'
## Warning: Coercing text to numeric in E13717 / R13717C5: '1'
## Warning: Coercing text to numeric in E13718 / R13718C5: '1'
## Warning: Coercing text to numeric in E13719 / R13719C5: '1'
## Warning: Coercing text to numeric in E13720 / R13720C5: '1'
## Warning: Coercing text to numeric in E13721 / R13721C5: '1'
## Warning: Coercing text to numeric in E13722 / R13722C5: '1'
## Warning: Coercing text to numeric in E13723 / R13723C5: '1'
## Warning: Coercing text to numeric in E13724 / R13724C5: '1'
## Warning: Coercing text to numeric in E13725 / R13725C5: '1'
## Warning: Coercing text to numeric in E13726 / R13726C5: '1'
## Warning: Coercing text to numeric in E13727 / R13727C5: '1'
## Warning: Coercing text to numeric in E13728 / R13728C5: '1'
## Warning: Coercing text to numeric in E13729 / R13729C5: '1'
## Warning: Coercing text to numeric in E13730 / R13730C5: '2'
## Warning: Coercing text to numeric in E13731 / R13731C5: '2'
## Warning: Coercing text to numeric in E13732 / R13732C5: '2'
## Warning: Coercing text to numeric in E13733 / R13733C5: '2'
## Warning: Coercing text to numeric in E13734 / R13734C5: '2'
## Warning: Coercing text to numeric in E13735 / R13735C5: '2'
## Warning: Coercing text to numeric in E13736 / R13736C5: '2'
## Warning: Coercing text to numeric in E13737 / R13737C5: '2'
## Warning: Coercing text to numeric in E13738 / R13738C5: '2'
## Warning: Coercing text to numeric in E13739 / R13739C5: '2'
## Warning: Coercing text to numeric in E13740 / R13740C5: '2'
## Warning: Coercing text to numeric in E13741 / R13741C5: '2'
## Warning: Coercing text to numeric in E13742 / R13742C5: '1'
## Warning: Coercing text to numeric in E13743 / R13743C5: '1'
## Warning: Coercing text to numeric in E13744 / R13744C5: '1'
## Warning: Coercing text to numeric in E13745 / R13745C5: '1'
## Warning: Coercing text to numeric in E13746 / R13746C5: '1'
## Warning: Coercing text to numeric in E13747 / R13747C5: '1'
## Warning: Coercing text to numeric in E13748 / R13748C5: '1'
## Warning: Coercing text to numeric in E13749 / R13749C5: '1'
## Warning: Coercing text to numeric in E13750 / R13750C5: '1'
## Warning: Coercing text to numeric in E13751 / R13751C5: '1'
## Warning: Coercing text to numeric in E13752 / R13752C5: '1'
## Warning: Coercing text to numeric in E13753 / R13753C5: '1'
## Warning: Coercing text to numeric in E13754 / R13754C5: '1'
## Warning: Coercing text to numeric in E13755 / R13755C5: '1'
## Warning: Coercing text to numeric in E13756 / R13756C5: '1'
## Warning: Coercing text to numeric in E13757 / R13757C5: '1'
## Warning: Coercing text to numeric in E13758 / R13758C5: '1'
## Warning: Coercing text to numeric in E13759 / R13759C5: '1'
## Warning: Coercing text to numeric in E13760 / R13760C5: '1'
## Warning: Coercing text to numeric in E13761 / R13761C5: '1'
## Warning: Coercing text to numeric in E13762 / R13762C5: '1'
## Warning: Coercing text to numeric in E13763 / R13763C5: '1'
## Warning: Coercing text to numeric in E13764 / R13764C5: '1'
## Warning: Coercing text to numeric in E13765 / R13765C5: '1'
## Warning: Coercing text to numeric in E13766 / R13766C5: '1'
## Warning: Coercing text to numeric in E13767 / R13767C5: '1'
## Warning: Coercing text to numeric in E13768 / R13768C5: '1'
## Warning: Coercing text to numeric in E13769 / R13769C5: '1'
## Warning: Coercing text to numeric in E13770 / R13770C5: '1'
## Warning: Coercing text to numeric in E13771 / R13771C5: '1'
## Warning: Coercing text to numeric in E13772 / R13772C5: '2'
## Warning: Coercing text to numeric in E13773 / R13773C5: '2'
## Warning: Coercing text to numeric in E13774 / R13774C5: '2'
## Warning: Coercing text to numeric in E13775 / R13775C5: '2'
## Warning: Coercing text to numeric in E13776 / R13776C5: '2'
## Warning: Coercing text to numeric in E13777 / R13777C5: '2'
## Warning: Coercing text to numeric in E13778 / R13778C5: '2'
## Warning: Coercing text to numeric in E13779 / R13779C5: '2'
## Warning: Coercing text to numeric in E13780 / R13780C5: '2'
## Warning: Coercing text to numeric in E13781 / R13781C5: '2'
## Warning: Coercing text to numeric in E13782 / R13782C5: '2'
## Warning: Coercing text to numeric in E13783 / R13783C5: '2'
## Warning: Coercing text to numeric in E13784 / R13784C5: '1'
## Warning: Coercing text to numeric in E13785 / R13785C5: '1'
## Warning: Coercing text to numeric in E13786 / R13786C5: '1'
## Warning: Coercing text to numeric in E13787 / R13787C5: '1'
## Warning: Coercing text to numeric in E13788 / R13788C5: '1'
## Warning: Coercing text to numeric in E13789 / R13789C5: '1'
## Warning: Coercing text to numeric in E13790 / R13790C5: '1'
## Warning: Coercing text to numeric in E13791 / R13791C5: '1'
## Warning: Coercing text to numeric in E13792 / R13792C5: '1'
## Warning: Coercing text to numeric in E13793 / R13793C5: '1'
## Warning: Coercing text to numeric in E13794 / R13794C5: '1'
## Warning: Coercing text to numeric in E13795 / R13795C5: '1'
## Warning: Coercing text to numeric in E13796 / R13796C5: '1'
## Warning: Coercing text to numeric in E13797 / R13797C5: '1'
## Warning: Coercing text to numeric in E13798 / R13798C5: '1'
## Warning: Coercing text to numeric in E13799 / R13799C5: '1'
## Warning: Coercing text to numeric in E13800 / R13800C5: '1'
## Warning: Coercing text to numeric in E13801 / R13801C5: '1'
## Warning: Coercing text to numeric in E13802 / R13802C5: '2'
## Warning: Coercing text to numeric in E13803 / R13803C5: '2'
## Warning: Coercing text to numeric in E13804 / R13804C5: '2'
## Warning: Coercing text to numeric in E13805 / R13805C5: '2'
## Warning: Coercing text to numeric in E13806 / R13806C5: '2'
## Warning: Coercing text to numeric in E13807 / R13807C5: '2'
## Warning: Coercing text to numeric in E13808 / R13808C5: '2'
## Warning: Coercing text to numeric in E13809 / R13809C5: '2'
## Warning: Coercing text to numeric in E13810 / R13810C5: '2'
## Warning: Coercing text to numeric in E13811 / R13811C5: '2'
## Warning: Coercing text to numeric in E13812 / R13812C5: '2'
## Warning: Coercing text to numeric in E13813 / R13813C5: '2'
## Warning: Coercing text to numeric in E13814 / R13814C5: '2'
## Warning: Coercing text to numeric in E13815 / R13815C5: '2'
## Warning: Coercing text to numeric in E13816 / R13816C5: '2'
## Warning: Coercing text to numeric in E13817 / R13817C5: '2'
## Warning: Coercing text to numeric in E13818 / R13818C5: '2'
## Warning: Coercing text to numeric in E13819 / R13819C5: '2'
## Warning: Coercing text to numeric in E13820 / R13820C5: '1'
## Warning: Coercing text to numeric in E13821 / R13821C5: '1'
## Warning: Coercing text to numeric in E13822 / R13822C5: '1'
## Warning: Coercing text to numeric in E13823 / R13823C5: '1'
## Warning: Coercing text to numeric in E13824 / R13824C5: '1'
## Warning: Coercing text to numeric in E13825 / R13825C5: '1'
## Warning: Coercing text to numeric in E13826 / R13826C5: '1'
## Warning: Coercing text to numeric in E13827 / R13827C5: '1'
## Warning: Coercing text to numeric in E13828 / R13828C5: '1'
## Warning: Coercing text to numeric in E13829 / R13829C5: '1'
## Warning: Coercing text to numeric in E13830 / R13830C5: '1'
## Warning: Coercing text to numeric in E13831 / R13831C5: '1'
## Warning: Coercing text to numeric in E13832 / R13832C5: '2'
## Warning: Coercing text to numeric in E13833 / R13833C5: '2'
## Warning: Coercing text to numeric in E13834 / R13834C5: '2'
## Warning: Coercing text to numeric in E13835 / R13835C5: '2'
## Warning: Coercing text to numeric in E13836 / R13836C5: '2'
## Warning: Coercing text to numeric in E13837 / R13837C5: '2'
## Warning: Coercing text to numeric in E13838 / R13838C5: '2'
## Warning: Coercing text to numeric in E13839 / R13839C5: '2'
## Warning: Coercing text to numeric in E13840 / R13840C5: '2'
## Warning: Coercing text to numeric in E13841 / R13841C5: '2'
## Warning: Coercing text to numeric in E13842 / R13842C5: '2'
## Warning: Coercing text to numeric in E13843 / R13843C5: '2'
## Warning: Coercing text to numeric in E13844 / R13844C5: '1'
## Warning: Coercing text to numeric in E13845 / R13845C5: '1'
## Warning: Coercing text to numeric in E13846 / R13846C5: '1'
## Warning: Coercing text to numeric in E13847 / R13847C5: '1'
## Warning: Coercing text to numeric in E13848 / R13848C5: '1'
## Warning: Coercing text to numeric in E13849 / R13849C5: '1'
## Warning: Coercing text to numeric in E13850 / R13850C5: '1'
## Warning: Coercing text to numeric in E13851 / R13851C5: '1'
## Warning: Coercing text to numeric in E13852 / R13852C5: '1'
## Warning: Coercing text to numeric in E13853 / R13853C5: '1'
## Warning: Coercing text to numeric in E13854 / R13854C5: '1'
## Warning: Coercing text to numeric in E13855 / R13855C5: '1'
## Warning: Coercing text to numeric in E13856 / R13856C5: '2'
## Warning: Coercing text to numeric in E13857 / R13857C5: '2'
## Warning: Coercing text to numeric in E13858 / R13858C5: '2'
## Warning: Coercing text to numeric in E13859 / R13859C5: '2'
## Warning: Coercing text to numeric in E13860 / R13860C5: '2'
## Warning: Coercing text to numeric in E13861 / R13861C5: '2'
## Warning: Coercing text to numeric in E13862 / R13862C5: '2'
## Warning: Coercing text to numeric in E13863 / R13863C5: '2'
## Warning: Coercing text to numeric in E13864 / R13864C5: '2'
## Warning: Coercing text to numeric in E13865 / R13865C5: '2'
## Warning: Coercing text to numeric in E13866 / R13866C5: '2'
## Warning: Coercing text to numeric in E13867 / R13867C5: '2'
## Warning: Coercing text to numeric in E13868 / R13868C5: '1'
## Warning: Coercing text to numeric in E13869 / R13869C5: '1'
## Warning: Coercing text to numeric in E13870 / R13870C5: '1'
## Warning: Coercing text to numeric in E13871 / R13871C5: '1'
## Warning: Coercing text to numeric in E13872 / R13872C5: '1'
## Warning: Coercing text to numeric in E13873 / R13873C5: '1'
## Warning: Coercing text to numeric in E13874 / R13874C5: '1'
## Warning: Coercing text to numeric in E13875 / R13875C5: '1'
## Warning: Coercing text to numeric in E13876 / R13876C5: '1'
## Warning: Coercing text to numeric in E13877 / R13877C5: '1'
## Warning: Coercing text to numeric in E13878 / R13878C5: '1'
## Warning: Coercing text to numeric in E13879 / R13879C5: '1'
## Warning: Coercing text to numeric in E13880 / R13880C5: '2'
## Warning: Coercing text to numeric in E13881 / R13881C5: '2'
## Warning: Coercing text to numeric in E13882 / R13882C5: '2'
## Warning: Coercing text to numeric in E13883 / R13883C5: '2'
## Warning: Coercing text to numeric in E13884 / R13884C5: '2'
## Warning: Coercing text to numeric in E13885 / R13885C5: '2'
## Warning: Coercing text to numeric in E13886 / R13886C5: '2'
## Warning: Coercing text to numeric in E13887 / R13887C5: '2'
## Warning: Coercing text to numeric in E13888 / R13888C5: '2'
## Warning: Coercing text to numeric in E13889 / R13889C5: '2'
## Warning: Coercing text to numeric in E13890 / R13890C5: '2'
## Warning: Coercing text to numeric in E13891 / R13891C5: '2'
## Warning: Coercing text to numeric in E13892 / R13892C5: '1'
## Warning: Coercing text to numeric in E13893 / R13893C5: '1'
## Warning: Coercing text to numeric in E13894 / R13894C5: '1'
## Warning: Coercing text to numeric in E13895 / R13895C5: '1'
## Warning: Coercing text to numeric in E13896 / R13896C5: '1'
## Warning: Coercing text to numeric in E13897 / R13897C5: '1'
## Warning: Coercing text to numeric in E13898 / R13898C5: '2'
## Warning: Coercing text to numeric in E13899 / R13899C5: '2'
## Warning: Coercing text to numeric in E13900 / R13900C5: '2'
## Warning: Coercing text to numeric in E13901 / R13901C5: '2'
## Warning: Coercing text to numeric in E13902 / R13902C5: '2'
## Warning: Coercing text to numeric in E13903 / R13903C5: '2'
## Warning: Coercing text to numeric in E13904 / R13904C5: '2'
## Warning: Coercing text to numeric in E13905 / R13905C5: '2'
## Warning: Coercing text to numeric in E13906 / R13906C5: '2'
## Warning: Coercing text to numeric in E13907 / R13907C5: '2'
## Warning: Coercing text to numeric in E13908 / R13908C5: '2'
## Warning: Coercing text to numeric in E13909 / R13909C5: '2'
## Warning: Coercing text to numeric in E13910 / R13910C5: '2'
## Warning: Coercing text to numeric in E13911 / R13911C5: '2'
## Warning: Coercing text to numeric in E13912 / R13912C5: '2'
## Warning: Coercing text to numeric in E13913 / R13913C5: '2'
## Warning: Coercing text to numeric in E13914 / R13914C5: '2'
## Warning: Coercing text to numeric in E13915 / R13915C5: '2'
## Warning: Coercing text to numeric in E13916 / R13916C5: '2'
## Warning: Coercing text to numeric in E13917 / R13917C5: '2'
## Warning: Coercing text to numeric in E13918 / R13918C5: '2'
## Warning: Coercing text to numeric in E13919 / R13919C5: '2'
## Warning: Coercing text to numeric in E13920 / R13920C5: '2'
## Warning: Coercing text to numeric in E13921 / R13921C5: '2'
## Warning: Coercing text to numeric in E13922 / R13922C5: '2'
## Warning: Coercing text to numeric in E13923 / R13923C5: '2'
## Warning: Coercing text to numeric in E13924 / R13924C5: '2'
## Warning: Coercing text to numeric in E13925 / R13925C5: '2'
## Warning: Coercing text to numeric in E13926 / R13926C5: '2'
## Warning: Coercing text to numeric in E13927 / R13927C5: '2'
## Warning: Coercing text to numeric in E13928 / R13928C5: '1'
## Warning: Coercing text to numeric in E13929 / R13929C5: '1'
## Warning: Coercing text to numeric in E13930 / R13930C5: '1'
## Warning: Coercing text to numeric in E13931 / R13931C5: '1'
## Warning: Coercing text to numeric in E13932 / R13932C5: '1'
## Warning: Coercing text to numeric in E13933 / R13933C5: '1'
## Warning: Coercing text to numeric in E13934 / R13934C5: '2'
## Warning: Coercing text to numeric in E13935 / R13935C5: '2'
## Warning: Coercing text to numeric in E13936 / R13936C5: '2'
## Warning: Coercing text to numeric in E13937 / R13937C5: '2'
## Warning: Coercing text to numeric in E13938 / R13938C5: '2'
## Warning: Coercing text to numeric in E13939 / R13939C5: '2'
## Warning: Coercing text to numeric in E13940 / R13940C5: '2'
## Warning: Coercing text to numeric in E13941 / R13941C5: '2'
## Warning: Coercing text to numeric in E13942 / R13942C5: '2'
## Warning: Coercing text to numeric in E13943 / R13943C5: '2'
## Warning: Coercing text to numeric in E13944 / R13944C5: '2'
## Warning: Coercing text to numeric in E13945 / R13945C5: '2'
## Warning: Coercing text to numeric in E13946 / R13946C5: '1'
## Warning: Coercing text to numeric in E13947 / R13947C5: '1'
## Warning: Coercing text to numeric in E13948 / R13948C5: '1'
## Warning: Coercing text to numeric in E13949 / R13949C5: '1'
## Warning: Coercing text to numeric in E13950 / R13950C5: '1'
## Warning: Coercing text to numeric in E13951 / R13951C5: '1'
## Warning: Coercing text to numeric in E13952 / R13952C5: '2'
## Warning: Coercing text to numeric in E13953 / R13953C5: '2'
## Warning: Coercing text to numeric in E13954 / R13954C5: '2'
## Warning: Coercing text to numeric in E13955 / R13955C5: '2'
## Warning: Coercing text to numeric in E13956 / R13956C5: '2'
## Warning: Coercing text to numeric in E13957 / R13957C5: '2'
## Warning: Coercing text to numeric in E13958 / R13958C5: '2'
## Warning: Coercing text to numeric in E13959 / R13959C5: '2'
## Warning: Coercing text to numeric in E13960 / R13960C5: '2'
## Warning: Coercing text to numeric in E13961 / R13961C5: '2'
## Warning: Coercing text to numeric in E13962 / R13962C5: '2'
## Warning: Coercing text to numeric in E13963 / R13963C5: '2'
## Warning: Coercing text to numeric in E13964 / R13964C5: '1'
## Warning: Coercing text to numeric in E13965 / R13965C5: '1'
## Warning: Coercing text to numeric in E13966 / R13966C5: '1'
## Warning: Coercing text to numeric in E13967 / R13967C5: '1'
## Warning: Coercing text to numeric in E13968 / R13968C5: '1'
## Warning: Coercing text to numeric in E13969 / R13969C5: '1'
## Warning: Coercing text to numeric in E13970 / R13970C5: '1'
## Warning: Coercing text to numeric in E13971 / R13971C5: '1'
## Warning: Coercing text to numeric in E13972 / R13972C5: '1'
## Warning: Coercing text to numeric in E13973 / R13973C5: '1'
## Warning: Coercing text to numeric in E13974 / R13974C5: '1'
## Warning: Coercing text to numeric in E13975 / R13975C5: '1'
## Warning: Coercing text to numeric in E13976 / R13976C5: '1'
## Warning: Coercing text to numeric in E13977 / R13977C5: '1'
## Warning: Coercing text to numeric in E13978 / R13978C5: '1'
## Warning: Coercing text to numeric in E13979 / R13979C5: '1'
## Warning: Coercing text to numeric in E13980 / R13980C5: '1'
## Warning: Coercing text to numeric in E13981 / R13981C5: '1'
## Warning: Coercing text to numeric in E13982 / R13982C5: '1'
## Warning: Coercing text to numeric in E13983 / R13983C5: '1'
## Warning: Coercing text to numeric in E13984 / R13984C5: '1'
## Warning: Coercing text to numeric in E13985 / R13985C5: '1'
## Warning: Coercing text to numeric in E13986 / R13986C5: '1'
## Warning: Coercing text to numeric in E13987 / R13987C5: '1'
## Warning: Coercing text to numeric in E13988 / R13988C5: '1'
## Warning: Coercing text to numeric in E13989 / R13989C5: '1'
## Warning: Coercing text to numeric in E13990 / R13990C5: '1'
## Warning: Coercing text to numeric in E13991 / R13991C5: '1'
## Warning: Coercing text to numeric in E13992 / R13992C5: '1'
## Warning: Coercing text to numeric in E13993 / R13993C5: '1'
## Warning: Coercing text to numeric in E13994 / R13994C5: '1'
## Warning: Coercing text to numeric in E13995 / R13995C5: '1'
## Warning: Coercing text to numeric in E13996 / R13996C5: '1'
## Warning: Coercing text to numeric in E13997 / R13997C5: '1'
## Warning: Coercing text to numeric in E13998 / R13998C5: '1'
## Warning: Coercing text to numeric in E13999 / R13999C5: '1'
## Warning: Coercing text to numeric in E14000 / R14000C5: '1'
## Warning: Coercing text to numeric in E14001 / R14001C5: '1'
## Warning: Coercing text to numeric in E14002 / R14002C5: '1'
## Warning: Coercing text to numeric in E14003 / R14003C5: '1'
## Warning: Coercing text to numeric in E14004 / R14004C5: '1'
## Warning: Coercing text to numeric in E14005 / R14005C5: '1'
## Warning: Coercing text to numeric in E14006 / R14006C5: '2'
## Warning: Coercing text to numeric in E14007 / R14007C5: '2'
## Warning: Coercing text to numeric in E14008 / R14008C5: '2'
## Warning: Coercing text to numeric in E14009 / R14009C5: '2'
## Warning: Coercing text to numeric in E14010 / R14010C5: '2'
## Warning: Coercing text to numeric in E14011 / R14011C5: '2'
## Warning: Coercing text to numeric in E14012 / R14012C5: '2'
## Warning: Coercing text to numeric in E14013 / R14013C5: '2'
## Warning: Coercing text to numeric in E14014 / R14014C5: '2'
## Warning: Coercing text to numeric in E14015 / R14015C5: '2'
## Warning: Coercing text to numeric in E14016 / R14016C5: '2'
## Warning: Coercing text to numeric in E14017 / R14017C5: '2'
## Warning: Coercing text to numeric in E14018 / R14018C5: '2'
## Warning: Coercing text to numeric in E14019 / R14019C5: '2'
## Warning: Coercing text to numeric in E14020 / R14020C5: '2'
## Warning: Coercing text to numeric in E14021 / R14021C5: '2'
## Warning: Coercing text to numeric in E14022 / R14022C5: '2'
## Warning: Coercing text to numeric in E14023 / R14023C5: '2'
## Warning: Coercing text to numeric in E14024 / R14024C5: '2'
## Warning: Coercing text to numeric in E14025 / R14025C5: '2'
## Warning: Coercing text to numeric in E14026 / R14026C5: '2'
## Warning: Coercing text to numeric in E14027 / R14027C5: '2'
## Warning: Coercing text to numeric in E14028 / R14028C5: '2'
## Warning: Coercing text to numeric in E14029 / R14029C5: '2'
## Warning: Coercing text to numeric in E14030 / R14030C5: '1'
## Warning: Coercing text to numeric in E14031 / R14031C5: '1'
## Warning: Coercing text to numeric in E14032 / R14032C5: '1'
## Warning: Coercing text to numeric in E14033 / R14033C5: '1'
## Warning: Coercing text to numeric in E14034 / R14034C5: '1'
## Warning: Coercing text to numeric in E14035 / R14035C5: '1'
## Warning: Coercing text to numeric in E14036 / R14036C5: '1'
## Warning: Coercing text to numeric in E14037 / R14037C5: '1'
## Warning: Coercing text to numeric in E14038 / R14038C5: '1'
## Warning: Coercing text to numeric in E14039 / R14039C5: '1'
## Warning: Coercing text to numeric in E14040 / R14040C5: '1'
## Warning: Coercing text to numeric in E14041 / R14041C5: '1'
## Warning: Coercing text to numeric in E14042 / R14042C5: '2'
## Warning: Coercing text to numeric in E14043 / R14043C5: '2'
## Warning: Coercing text to numeric in E14044 / R14044C5: '2'
## Warning: Coercing text to numeric in E14045 / R14045C5: '2'
## Warning: Coercing text to numeric in E14046 / R14046C5: '2'
## Warning: Coercing text to numeric in E14047 / R14047C5: '2'
## Warning: Coercing text to numeric in E14048 / R14048C5: '2'
## Warning: Coercing text to numeric in E14049 / R14049C5: '2'
## Warning: Coercing text to numeric in E14050 / R14050C5: '2'
## Warning: Coercing text to numeric in E14051 / R14051C5: '2'
## Warning: Coercing text to numeric in E14052 / R14052C5: '2'
## Warning: Coercing text to numeric in E14053 / R14053C5: '2'
## Warning: Coercing text to numeric in E14054 / R14054C5: '1'
## Warning: Coercing text to numeric in E14055 / R14055C5: '1'
## Warning: Coercing text to numeric in E14056 / R14056C5: '1'
## Warning: Coercing text to numeric in E14057 / R14057C5: '1'
## Warning: Coercing text to numeric in E14058 / R14058C5: '1'
## Warning: Coercing text to numeric in E14059 / R14059C5: '1'
## Warning: Coercing text to numeric in E14060 / R14060C5: '2'
## Warning: Coercing text to numeric in E14061 / R14061C5: '2'
## Warning: Coercing text to numeric in E14062 / R14062C5: '2'
## Warning: Coercing text to numeric in E14063 / R14063C5: '2'
## Warning: Coercing text to numeric in E14064 / R14064C5: '2'
## Warning: Coercing text to numeric in E14065 / R14065C5: '2'
## Warning: Coercing text to numeric in E14066 / R14066C5: '1'
## Warning: Coercing text to numeric in E14067 / R14067C5: '1'
## Warning: Coercing text to numeric in E14068 / R14068C5: '1'
## Warning: Coercing text to numeric in E14069 / R14069C5: '1'
## Warning: Coercing text to numeric in E14070 / R14070C5: '1'
## Warning: Coercing text to numeric in E14071 / R14071C5: '1'
## Warning: Coercing text to numeric in E14072 / R14072C5: '2'
## Warning: Coercing text to numeric in E14073 / R14073C5: '2'
## Warning: Coercing text to numeric in E14074 / R14074C5: '2'
## Warning: Coercing text to numeric in E14075 / R14075C5: '2'
## Warning: Coercing text to numeric in E14076 / R14076C5: '2'
## Warning: Coercing text to numeric in E14077 / R14077C5: '2'
## Warning: Coercing text to numeric in E14078 / R14078C5: '1'
## Warning: Coercing text to numeric in E14079 / R14079C5: '1'
## Warning: Coercing text to numeric in E14080 / R14080C5: '1'
## Warning: Coercing text to numeric in E14081 / R14081C5: '1'
## Warning: Coercing text to numeric in E14082 / R14082C5: '1'
## Warning: Coercing text to numeric in E14083 / R14083C5: '1'
## Warning: Coercing text to numeric in E14084 / R14084C5: '2'
## Warning: Coercing text to numeric in E14085 / R14085C5: '2'
## Warning: Coercing text to numeric in E14086 / R14086C5: '2'
## Warning: Coercing text to numeric in E14087 / R14087C5: '2'
## Warning: Coercing text to numeric in E14088 / R14088C5: '2'
## Warning: Coercing text to numeric in E14089 / R14089C5: '2'
## Warning: Coercing text to numeric in E14090 / R14090C5: '2'
## Warning: Coercing text to numeric in E14091 / R14091C5: '2'
## Warning: Coercing text to numeric in E14092 / R14092C5: '2'
## Warning: Coercing text to numeric in E14093 / R14093C5: '2'
## Warning: Coercing text to numeric in E14094 / R14094C5: '2'
## Warning: Coercing text to numeric in E14095 / R14095C5: '2'
## Warning: Coercing text to numeric in E14096 / R14096C5: '1'
## Warning: Coercing text to numeric in E14097 / R14097C5: '1'
## Warning: Coercing text to numeric in E14098 / R14098C5: '1'
## Warning: Coercing text to numeric in E14099 / R14099C5: '1'
## Warning: Coercing text to numeric in E14100 / R14100C5: '1'
## Warning: Coercing text to numeric in E14101 / R14101C5: '1'
## Warning: Coercing text to numeric in E14102 / R14102C5: '2'
## Warning: Coercing text to numeric in E14103 / R14103C5: '2'
## Warning: Coercing text to numeric in E14104 / R14104C5: '2'
## Warning: Coercing text to numeric in E14105 / R14105C5: '2'
## Warning: Coercing text to numeric in E14106 / R14106C5: '2'
## Warning: Coercing text to numeric in E14107 / R14107C5: '2'
## Warning: Coercing text to numeric in E14108 / R14108C5: '2'
## Warning: Coercing text to numeric in E14109 / R14109C5: '2'
## Warning: Coercing text to numeric in E14110 / R14110C5: '2'
## Warning: Coercing text to numeric in E14111 / R14111C5: '2'
## Warning: Coercing text to numeric in E14112 / R14112C5: '2'
## Warning: Coercing text to numeric in E14113 / R14113C5: '2'
## Warning: Coercing text to numeric in E14114 / R14114C5: '1'
## Warning: Coercing text to numeric in E14115 / R14115C5: '1'
## Warning: Coercing text to numeric in E14116 / R14116C5: '1'
## Warning: Coercing text to numeric in E14117 / R14117C5: '1'
## Warning: Coercing text to numeric in E14118 / R14118C5: '1'
## Warning: Coercing text to numeric in E14119 / R14119C5: '1'
## Warning: Coercing text to numeric in E14120 / R14120C5: '1'
## Warning: Coercing text to numeric in E14121 / R14121C5: '1'
## Warning: Coercing text to numeric in E14122 / R14122C5: '1'
## Warning: Coercing text to numeric in E14123 / R14123C5: '1'
## Warning: Coercing text to numeric in E14124 / R14124C5: '1'
## Warning: Coercing text to numeric in E14125 / R14125C5: '1'
## Warning: Coercing text to numeric in E14126 / R14126C5: '2'
## Warning: Coercing text to numeric in E14127 / R14127C5: '2'
## Warning: Coercing text to numeric in E14128 / R14128C5: '2'
## Warning: Coercing text to numeric in E14129 / R14129C5: '2'
## Warning: Coercing text to numeric in E14130 / R14130C5: '2'
## Warning: Coercing text to numeric in E14131 / R14131C5: '2'
## Warning: Coercing text to numeric in E14132 / R14132C5: '1'
## Warning: Coercing text to numeric in E14133 / R14133C5: '1'
## Warning: Coercing text to numeric in E14134 / R14134C5: '1'
## Warning: Coercing text to numeric in E14135 / R14135C5: '1'
## Warning: Coercing text to numeric in E14136 / R14136C5: '1'
## Warning: Coercing text to numeric in E14137 / R14137C5: '1'
## Warning: Coercing text to numeric in E14138 / R14138C5: '2'
## Warning: Coercing text to numeric in E14139 / R14139C5: '2'
## Warning: Coercing text to numeric in E14140 / R14140C5: '2'
## Warning: Coercing text to numeric in E14141 / R14141C5: '2'
## Warning: Coercing text to numeric in E14142 / R14142C5: '2'
## Warning: Coercing text to numeric in E14143 / R14143C5: '2'
## Warning: Coercing text to numeric in E14144 / R14144C5: '1'
## Warning: Coercing text to numeric in E14145 / R14145C5: '1'
## Warning: Coercing text to numeric in E14146 / R14146C5: '1'
## Warning: Coercing text to numeric in E14147 / R14147C5: '1'
## Warning: Coercing text to numeric in E14148 / R14148C5: '1'
## Warning: Coercing text to numeric in E14149 / R14149C5: '1'
## Warning: Coercing text to numeric in E14150 / R14150C5: '2'
## Warning: Coercing text to numeric in E14151 / R14151C5: '2'
## Warning: Coercing text to numeric in E14152 / R14152C5: '2'
## Warning: Coercing text to numeric in E14153 / R14153C5: '2'
## Warning: Coercing text to numeric in E14154 / R14154C5: '2'
## Warning: Coercing text to numeric in E14155 / R14155C5: '2'
## Warning: Coercing text to numeric in E14156 / R14156C5: '2'
## Warning: Coercing text to numeric in E14157 / R14157C5: '2'
## Warning: Coercing text to numeric in E14158 / R14158C5: '2'
## Warning: Coercing text to numeric in E14159 / R14159C5: '2'
## Warning: Coercing text to numeric in E14160 / R14160C5: '2'
## Warning: Coercing text to numeric in E14161 / R14161C5: '2'
## Warning: Coercing text to numeric in E14162 / R14162C5: '2'
## Warning: Coercing text to numeric in E14163 / R14163C5: '2'
## Warning: Coercing text to numeric in E14164 / R14164C5: '2'
## Warning: Coercing text to numeric in E14165 / R14165C5: '2'
## Warning: Coercing text to numeric in E14166 / R14166C5: '2'
## Warning: Coercing text to numeric in E14167 / R14167C5: '2'
## Warning: Coercing text to numeric in E14168 / R14168C5: '2'
## Warning: Coercing text to numeric in E14169 / R14169C5: '2'
## Warning: Coercing text to numeric in E14170 / R14170C5: '2'
## Warning: Coercing text to numeric in E14171 / R14171C5: '2'
## Warning: Coercing text to numeric in E14172 / R14172C5: '2'
## Warning: Coercing text to numeric in E14173 / R14173C5: '2'
## Warning: Coercing text to numeric in E14174 / R14174C5: '2'
## Warning: Coercing text to numeric in E14175 / R14175C5: '2'
## Warning: Coercing text to numeric in E14176 / R14176C5: '2'
## Warning: Coercing text to numeric in E14177 / R14177C5: '2'
## Warning: Coercing text to numeric in E14178 / R14178C5: '2'
## Warning: Coercing text to numeric in E14179 / R14179C5: '2'
## Warning: Coercing text to numeric in E14180 / R14180C5: '2'
## Warning: Coercing text to numeric in E14181 / R14181C5: '2'
## Warning: Coercing text to numeric in E14182 / R14182C5: '2'
## Warning: Coercing text to numeric in E14183 / R14183C5: '2'
## Warning: Coercing text to numeric in E14184 / R14184C5: '2'
## Warning: Coercing text to numeric in E14185 / R14185C5: '2'
## Warning: Coercing text to numeric in E14186 / R14186C5: '2'
## Warning: Coercing text to numeric in E14187 / R14187C5: '2'
## Warning: Coercing text to numeric in E14188 / R14188C5: '2'
## Warning: Coercing text to numeric in E14189 / R14189C5: '2'
## Warning: Coercing text to numeric in E14190 / R14190C5: '2'
## Warning: Coercing text to numeric in E14191 / R14191C5: '2'
## Warning: Coercing text to numeric in E14192 / R14192C5: '2'
## Warning: Coercing text to numeric in E14193 / R14193C5: '2'
## Warning: Coercing text to numeric in E14194 / R14194C5: '2'
## Warning: Coercing text to numeric in E14195 / R14195C5: '2'
## Warning: Coercing text to numeric in E14196 / R14196C5: '2'
## Warning: Coercing text to numeric in E14197 / R14197C5: '2'
## Warning: Coercing text to numeric in E14198 / R14198C5: '2'
## Warning: Coercing text to numeric in E14199 / R14199C5: '2'
## Warning: Coercing text to numeric in E14200 / R14200C5: '2'
## Warning: Coercing text to numeric in E14201 / R14201C5: '2'
## Warning: Coercing text to numeric in E14202 / R14202C5: '2'
## Warning: Coercing text to numeric in E14203 / R14203C5: '2'
## Warning: Coercing text to numeric in E14204 / R14204C5: '2'
## Warning: Coercing text to numeric in E14205 / R14205C5: '2'
## Warning: Coercing text to numeric in E14206 / R14206C5: '2'
## Warning: Coercing text to numeric in E14207 / R14207C5: '2'
## Warning: Coercing text to numeric in E14208 / R14208C5: '2'
## Warning: Coercing text to numeric in E14209 / R14209C5: '2'
## Warning: Coercing text to numeric in E14210 / R14210C5: '1'
## Warning: Coercing text to numeric in E14211 / R14211C5: '1'
## Warning: Coercing text to numeric in E14212 / R14212C5: '1'
## Warning: Coercing text to numeric in E14213 / R14213C5: '1'
## Warning: Coercing text to numeric in E14214 / R14214C5: '1'
## Warning: Coercing text to numeric in E14215 / R14215C5: '1'
## Warning: Coercing text to numeric in E14216 / R14216C5: '1'
## Warning: Coercing text to numeric in E14217 / R14217C5: '1'
## Warning: Coercing text to numeric in E14218 / R14218C5: '1'
## Warning: Coercing text to numeric in E14219 / R14219C5: '1'
## Warning: Coercing text to numeric in E14220 / R14220C5: '1'
## Warning: Coercing text to numeric in E14221 / R14221C5: '1'
## Warning: Coercing text to numeric in E14222 / R14222C5: '2'
## Warning: Coercing text to numeric in E14223 / R14223C5: '2'
## Warning: Coercing text to numeric in E14224 / R14224C5: '2'
## Warning: Coercing text to numeric in E14225 / R14225C5: '2'
## Warning: Coercing text to numeric in E14226 / R14226C5: '2'
## Warning: Coercing text to numeric in E14227 / R14227C5: '2'
## Warning: Coercing text to numeric in E14228 / R14228C5: '1'
## Warning: Coercing text to numeric in E14229 / R14229C5: '1'
## Warning: Coercing text to numeric in E14230 / R14230C5: '1'
## Warning: Coercing text to numeric in E14231 / R14231C5: '1'
## Warning: Coercing text to numeric in E14232 / R14232C5: '1'
## Warning: Coercing text to numeric in E14233 / R14233C5: '1'
## Warning: Coercing text to numeric in E14234 / R14234C5: '2'
## Warning: Coercing text to numeric in E14235 / R14235C5: '2'
## Warning: Coercing text to numeric in E14236 / R14236C5: '2'
## Warning: Coercing text to numeric in E14237 / R14237C5: '2'
## Warning: Coercing text to numeric in E14238 / R14238C5: '2'
## Warning: Coercing text to numeric in E14239 / R14239C5: '2'
## Warning: Coercing text to numeric in E14240 / R14240C5: '1'
## Warning: Coercing text to numeric in E14241 / R14241C5: '1'
## Warning: Coercing text to numeric in E14242 / R14242C5: '1'
## Warning: Coercing text to numeric in E14243 / R14243C5: '1'
## Warning: Coercing text to numeric in E14244 / R14244C5: '1'
## Warning: Coercing text to numeric in E14245 / R14245C5: '1'
## Warning: Coercing text to numeric in E14246 / R14246C5: '2'
## Warning: Coercing text to numeric in E14247 / R14247C5: '2'
## Warning: Coercing text to numeric in E14248 / R14248C5: '2'
## Warning: Coercing text to numeric in E14249 / R14249C5: '2'
## Warning: Coercing text to numeric in E14250 / R14250C5: '2'
## Warning: Coercing text to numeric in E14251 / R14251C5: '2'
## Warning: Coercing text to numeric in E14252 / R14252C5: '2'
## Warning: Coercing text to numeric in E14253 / R14253C5: '2'
## Warning: Coercing text to numeric in E14254 / R14254C5: '2'
## Warning: Coercing text to numeric in E14255 / R14255C5: '2'
## Warning: Coercing text to numeric in E14256 / R14256C5: '2'
## Warning: Coercing text to numeric in E14257 / R14257C5: '2'
## Warning: Coercing text to numeric in E14258 / R14258C5: '2'
## Warning: Coercing text to numeric in E14259 / R14259C5: '2'
## Warning: Coercing text to numeric in E14260 / R14260C5: '2'
## Warning: Coercing text to numeric in E14261 / R14261C5: '2'
## Warning: Coercing text to numeric in E14262 / R14262C5: '2'
## Warning: Coercing text to numeric in E14263 / R14263C5: '2'
## Warning: Coercing text to numeric in E14264 / R14264C5: '1'
## Warning: Coercing text to numeric in E14265 / R14265C5: '1'
## Warning: Coercing text to numeric in E14266 / R14266C5: '1'
## Warning: Coercing text to numeric in E14267 / R14267C5: '1'
## Warning: Coercing text to numeric in E14268 / R14268C5: '1'
## Warning: Coercing text to numeric in E14269 / R14269C5: '1'
## Warning: Coercing text to numeric in E14270 / R14270C5: '1'
## Warning: Coercing text to numeric in E14271 / R14271C5: '1'
## Warning: Coercing text to numeric in E14272 / R14272C5: '1'
## Warning: Coercing text to numeric in E14273 / R14273C5: '1'
## Warning: Coercing text to numeric in E14274 / R14274C5: '1'
## Warning: Coercing text to numeric in E14275 / R14275C5: '1'
## Warning: Coercing text to numeric in E14276 / R14276C5: '1'
## Warning: Coercing text to numeric in E14277 / R14277C5: '1'
## Warning: Coercing text to numeric in E14278 / R14278C5: '1'
## Warning: Coercing text to numeric in E14279 / R14279C5: '1'
## Warning: Coercing text to numeric in E14280 / R14280C5: '1'
## Warning: Coercing text to numeric in E14281 / R14281C5: '1'
## Warning: Coercing text to numeric in E14282 / R14282C5: '2'
## Warning: Coercing text to numeric in E14283 / R14283C5: '2'
## Warning: Coercing text to numeric in E14284 / R14284C5: '2'
## Warning: Coercing text to numeric in E14285 / R14285C5: '2'
## Warning: Coercing text to numeric in E14286 / R14286C5: '2'
## Warning: Coercing text to numeric in E14287 / R14287C5: '2'
## Warning: Coercing text to numeric in E14288 / R14288C5: '2'
## Warning: Coercing text to numeric in E14289 / R14289C5: '2'
## Warning: Coercing text to numeric in E14290 / R14290C5: '2'
## Warning: Coercing text to numeric in E14291 / R14291C5: '2'
## Warning: Coercing text to numeric in E14292 / R14292C5: '2'
## Warning: Coercing text to numeric in E14293 / R14293C5: '2'
## Warning: Coercing text to numeric in E14294 / R14294C5: '1'
## Warning: Coercing text to numeric in E14295 / R14295C5: '1'
## Warning: Coercing text to numeric in E14296 / R14296C5: '1'
## Warning: Coercing text to numeric in E14297 / R14297C5: '1'
## Warning: Coercing text to numeric in E14298 / R14298C5: '1'
## Warning: Coercing text to numeric in E14299 / R14299C5: '1'
## Warning: Coercing text to numeric in E14300 / R14300C5: '1'
## Warning: Coercing text to numeric in E14301 / R14301C5: '1'
## Warning: Coercing text to numeric in E14302 / R14302C5: '1'
## Warning: Coercing text to numeric in E14303 / R14303C5: '1'
## Warning: Coercing text to numeric in E14304 / R14304C5: '1'
## Warning: Coercing text to numeric in E14305 / R14305C5: '1'
## Warning: Coercing text to numeric in E14306 / R14306C5: '1'
## Warning: Coercing text to numeric in E14307 / R14307C5: '1'
## Warning: Coercing text to numeric in E14308 / R14308C5: '1'
## Warning: Coercing text to numeric in E14309 / R14309C5: '1'
## Warning: Coercing text to numeric in E14310 / R14310C5: '1'
## Warning: Coercing text to numeric in E14311 / R14311C5: '1'
## Warning: Coercing text to numeric in E14312 / R14312C5: '2'
## Warning: Coercing text to numeric in E14313 / R14313C5: '2'
## Warning: Coercing text to numeric in E14314 / R14314C5: '2'
## Warning: Coercing text to numeric in E14315 / R14315C5: '2'
## Warning: Coercing text to numeric in E14316 / R14316C5: '2'
## Warning: Coercing text to numeric in E14317 / R14317C5: '2'
## Warning: Coercing text to numeric in E14318 / R14318C5: '1'
## Warning: Coercing text to numeric in E14319 / R14319C5: '1'
## Warning: Coercing text to numeric in E14320 / R14320C5: '1'
## Warning: Coercing text to numeric in E14321 / R14321C5: '1'
## Warning: Coercing text to numeric in E14322 / R14322C5: '1'
## Warning: Coercing text to numeric in E14323 / R14323C5: '1'
## Warning: Coercing text to numeric in E14324 / R14324C5: '2'
## Warning: Coercing text to numeric in E14325 / R14325C5: '2'
## Warning: Coercing text to numeric in E14326 / R14326C5: '2'
## Warning: Coercing text to numeric in E14327 / R14327C5: '2'
## Warning: Coercing text to numeric in E14328 / R14328C5: '2'
## Warning: Coercing text to numeric in E14329 / R14329C5: '2'
## Warning: Coercing text to numeric in E14330 / R14330C5: '2'
## Warning: Coercing text to numeric in E14331 / R14331C5: '2'
## Warning: Coercing text to numeric in E14332 / R14332C5: '2'
## Warning: Coercing text to numeric in E14333 / R14333C5: '2'
## Warning: Coercing text to numeric in E14334 / R14334C5: '2'
## Warning: Coercing text to numeric in E14335 / R14335C5: '2'
## Warning: Coercing text to numeric in E14336 / R14336C5: '1'
## Warning: Coercing text to numeric in E14337 / R14337C5: '1'
## Warning: Coercing text to numeric in E14338 / R14338C5: '1'
## Warning: Coercing text to numeric in E14339 / R14339C5: '1'
## Warning: Coercing text to numeric in E14340 / R14340C5: '1'
## Warning: Coercing text to numeric in E14341 / R14341C5: '1'
## Warning: Coercing text to numeric in E14342 / R14342C5: '2'
## Warning: Coercing text to numeric in E14343 / R14343C5: '2'
## Warning: Coercing text to numeric in E14344 / R14344C5: '2'
## Warning: Coercing text to numeric in E14345 / R14345C5: '2'
## Warning: Coercing text to numeric in E14346 / R14346C5: '2'
## Warning: Coercing text to numeric in E14347 / R14347C5: '2'
## Warning: Coercing text to numeric in E14348 / R14348C5: '2'
## Warning: Coercing text to numeric in E14349 / R14349C5: '2'
## Warning: Coercing text to numeric in E14350 / R14350C5: '2'
## Warning: Coercing text to numeric in E14351 / R14351C5: '2'
## Warning: Coercing text to numeric in E14352 / R14352C5: '2'
## Warning: Coercing text to numeric in E14353 / R14353C5: '2'
## Warning: Coercing text to numeric in E14354 / R14354C5: '1'
## Warning: Coercing text to numeric in E14355 / R14355C5: '1'
## Warning: Coercing text to numeric in E14356 / R14356C5: '1'
## Warning: Coercing text to numeric in E14357 / R14357C5: '1'
## Warning: Coercing text to numeric in E14358 / R14358C5: '1'
## Warning: Coercing text to numeric in E14359 / R14359C5: '1'
## Warning: Coercing text to numeric in E14360 / R14360C5: '1'
## Warning: Coercing text to numeric in E14361 / R14361C5: '1'
## Warning: Coercing text to numeric in E14362 / R14362C5: '1'
## Warning: Coercing text to numeric in E14363 / R14363C5: '1'
## Warning: Coercing text to numeric in E14364 / R14364C5: '1'
## Warning: Coercing text to numeric in E14365 / R14365C5: '1'
## Warning: Coercing text to numeric in E14366 / R14366C5: '1'
## Warning: Coercing text to numeric in E14367 / R14367C5: '1'
## Warning: Coercing text to numeric in E14368 / R14368C5: '1'
## Warning: Coercing text to numeric in E14369 / R14369C5: '1'
## Warning: Coercing text to numeric in E14370 / R14370C5: '1'
## Warning: Coercing text to numeric in E14371 / R14371C5: '1'
## Warning: Coercing text to numeric in E14372 / R14372C5: '2'
## Warning: Coercing text to numeric in E14373 / R14373C5: '2'
## Warning: Coercing text to numeric in E14374 / R14374C5: '2'
## Warning: Coercing text to numeric in E14375 / R14375C5: '2'
## Warning: Coercing text to numeric in E14376 / R14376C5: '2'
## Warning: Coercing text to numeric in E14377 / R14377C5: '2'
## Warning: Coercing text to numeric in E14378 / R14378C5: '2'
## Warning: Coercing text to numeric in E14379 / R14379C5: '2'
## Warning: Coercing text to numeric in E14380 / R14380C5: '2'
## Warning: Coercing text to numeric in E14381 / R14381C5: '2'
## Warning: Coercing text to numeric in E14382 / R14382C5: '2'
## Warning: Coercing text to numeric in E14383 / R14383C5: '2'
## Warning: Coercing text to numeric in E14384 / R14384C5: '1'
## Warning: Coercing text to numeric in E14385 / R14385C5: '1'
## Warning: Coercing text to numeric in E14386 / R14386C5: '1'
## Warning: Coercing text to numeric in E14387 / R14387C5: '1'
## Warning: Coercing text to numeric in E14388 / R14388C5: '1'
## Warning: Coercing text to numeric in E14389 / R14389C5: '1'
## Warning: Coercing text to numeric in E14390 / R14390C5: '1'
## Warning: Coercing text to numeric in E14391 / R14391C5: '1'
## Warning: Coercing text to numeric in E14392 / R14392C5: '1'
## Warning: Coercing text to numeric in E14393 / R14393C5: '1'
## Warning: Coercing text to numeric in E14394 / R14394C5: '1'
## Warning: Coercing text to numeric in E14395 / R14395C5: '1'
## Warning: Coercing text to numeric in E14396 / R14396C5: '2'
## Warning: Coercing text to numeric in E14397 / R14397C5: '2'
## Warning: Coercing text to numeric in E14398 / R14398C5: '2'
## Warning: Coercing text to numeric in E14399 / R14399C5: '2'
## Warning: Coercing text to numeric in E14400 / R14400C5: '2'
## Warning: Coercing text to numeric in E14401 / R14401C5: '2'
## Warning: Coercing text to numeric in E14402 / R14402C5: '2'
## Warning: Coercing text to numeric in E14403 / R14403C5: '2'
## Warning: Coercing text to numeric in E14404 / R14404C5: '2'
## Warning: Coercing text to numeric in E14405 / R14405C5: '2'
## Warning: Coercing text to numeric in E14406 / R14406C5: '2'
## Warning: Coercing text to numeric in E14407 / R14407C5: '2'
## Warning: Coercing text to numeric in E14408 / R14408C5: '1'
## Warning: Coercing text to numeric in E14409 / R14409C5: '1'
## Warning: Coercing text to numeric in E14410 / R14410C5: '1'
## Warning: Coercing text to numeric in E14411 / R14411C5: '1'
## Warning: Coercing text to numeric in E14412 / R14412C5: '1'
## Warning: Coercing text to numeric in E14413 / R14413C5: '1'
## Warning: Coercing text to numeric in E14414 / R14414C5: '2'
## Warning: Coercing text to numeric in E14415 / R14415C5: '2'
## Warning: Coercing text to numeric in E14416 / R14416C5: '2'
## Warning: Coercing text to numeric in E14417 / R14417C5: '2'
## Warning: Coercing text to numeric in E14418 / R14418C5: '2'
## Warning: Coercing text to numeric in E14419 / R14419C5: '2'
## Warning: Coercing text to numeric in E14420 / R14420C5: '2'
## Warning: Coercing text to numeric in E14421 / R14421C5: '2'
## Warning: Coercing text to numeric in E14422 / R14422C5: '2'
## Warning: Coercing text to numeric in E14423 / R14423C5: '2'
## Warning: Coercing text to numeric in E14424 / R14424C5: '2'
## Warning: Coercing text to numeric in E14425 / R14425C5: '2'
## Warning: Coercing text to numeric in E14426 / R14426C5: '2'
## Warning: Coercing text to numeric in E14427 / R14427C5: '2'
## Warning: Coercing text to numeric in E14428 / R14428C5: '2'
## Warning: Coercing text to numeric in E14429 / R14429C5: '2'
## Warning: Coercing text to numeric in E14430 / R14430C5: '2'
## Warning: Coercing text to numeric in E14431 / R14431C5: '2'
## Warning: Coercing text to numeric in E14432 / R14432C5: '2'
## Warning: Coercing text to numeric in E14433 / R14433C5: '2'
## Warning: Coercing text to numeric in E14434 / R14434C5: '2'
## Warning: Coercing text to numeric in E14435 / R14435C5: '2'
## Warning: Coercing text to numeric in E14436 / R14436C5: '2'
## Warning: Coercing text to numeric in E14437 / R14437C5: '2'
## Warning: Coercing text to numeric in E14438 / R14438C5: '2'
## Warning: Coercing text to numeric in E14439 / R14439C5: '2'
## Warning: Coercing text to numeric in E14440 / R14440C5: '2'
## Warning: Coercing text to numeric in E14441 / R14441C5: '2'
## Warning: Coercing text to numeric in E14442 / R14442C5: '2'
## Warning: Coercing text to numeric in E14443 / R14443C5: '2'
## Warning: Coercing text to numeric in E14444 / R14444C5: '2'
## Warning: Coercing text to numeric in E14445 / R14445C5: '2'
## Warning: Coercing text to numeric in E14446 / R14446C5: '2'
## Warning: Coercing text to numeric in E14447 / R14447C5: '2'
## Warning: Coercing text to numeric in E14448 / R14448C5: '2'
## Warning: Coercing text to numeric in E14449 / R14449C5: '2'
## Warning: Coercing text to numeric in E14450 / R14450C5: '2'
## Warning: Coercing text to numeric in E14451 / R14451C5: '2'
## Warning: Coercing text to numeric in E14452 / R14452C5: '2'
## Warning: Coercing text to numeric in E14453 / R14453C5: '2'
## Warning: Coercing text to numeric in E14454 / R14454C5: '2'
## Warning: Coercing text to numeric in E14455 / R14455C5: '2'
## Warning: Coercing text to numeric in E14456 / R14456C5: '2'
## Warning: Coercing text to numeric in E14457 / R14457C5: '2'
## Warning: Coercing text to numeric in E14458 / R14458C5: '2'
## Warning: Coercing text to numeric in E14459 / R14459C5: '2'
## Warning: Coercing text to numeric in E14460 / R14460C5: '2'
## Warning: Coercing text to numeric in E14461 / R14461C5: '2'
## Warning: Coercing text to numeric in E14462 / R14462C5: '1'
## Warning: Coercing text to numeric in E14463 / R14463C5: '1'
## Warning: Coercing text to numeric in E14464 / R14464C5: '1'
## Warning: Coercing text to numeric in E14465 / R14465C5: '1'
## Warning: Coercing text to numeric in E14466 / R14466C5: '1'
## Warning: Coercing text to numeric in E14467 / R14467C5: '1'
## Warning: Coercing text to numeric in E14468 / R14468C5: '1'
## Warning: Coercing text to numeric in E14469 / R14469C5: '1'
## Warning: Coercing text to numeric in E14470 / R14470C5: '1'
## Warning: Coercing text to numeric in E14471 / R14471C5: '1'
## Warning: Coercing text to numeric in E14472 / R14472C5: '1'
## Warning: Coercing text to numeric in E14473 / R14473C5: '1'
## Warning: Coercing text to numeric in E14474 / R14474C5: '2'
## Warning: Coercing text to numeric in E14475 / R14475C5: '2'
## Warning: Coercing text to numeric in E14476 / R14476C5: '2'
## Warning: Coercing text to numeric in E14477 / R14477C5: '2'
## Warning: Coercing text to numeric in E14478 / R14478C5: '2'
## Warning: Coercing text to numeric in E14479 / R14479C5: '2'
## Warning: Coercing text to numeric in E14480 / R14480C5: '1'
## Warning: Coercing text to numeric in E14481 / R14481C5: '1'
## Warning: Coercing text to numeric in E14482 / R14482C5: '1'
## Warning: Coercing text to numeric in E14483 / R14483C5: '1'
## Warning: Coercing text to numeric in E14484 / R14484C5: '1'
## Warning: Coercing text to numeric in E14485 / R14485C5: '1'
## Warning: Coercing text to numeric in E14486 / R14486C5: '1'
## Warning: Coercing text to numeric in E14487 / R14487C5: '1'
## Warning: Coercing text to numeric in E14488 / R14488C5: '1'
## Warning: Coercing text to numeric in E14489 / R14489C5: '1'
## Warning: Coercing text to numeric in E14490 / R14490C5: '1'
## Warning: Coercing text to numeric in E14491 / R14491C5: '1'
## Warning: Coercing text to numeric in E14492 / R14492C5: '2'
## Warning: Coercing text to numeric in E14493 / R14493C5: '2'
## Warning: Coercing text to numeric in E14494 / R14494C5: '2'
## Warning: Coercing text to numeric in E14495 / R14495C5: '2'
## Warning: Coercing text to numeric in E14496 / R14496C5: '2'
## Warning: Coercing text to numeric in E14497 / R14497C5: '2'
## Warning: Coercing text to numeric in E14498 / R14498C5: '2'
## Warning: Coercing text to numeric in E14499 / R14499C5: '2'
## Warning: Coercing text to numeric in E14500 / R14500C5: '2'
## Warning: Coercing text to numeric in E14501 / R14501C5: '2'
## Warning: Coercing text to numeric in E14502 / R14502C5: '2'
## Warning: Coercing text to numeric in E14503 / R14503C5: '2'
## Warning: Coercing text to numeric in E14504 / R14504C5: '1'
## Warning: Coercing text to numeric in E14505 / R14505C5: '1'
## Warning: Coercing text to numeric in E14506 / R14506C5: '1'
## Warning: Coercing text to numeric in E14507 / R14507C5: '1'
## Warning: Coercing text to numeric in E14508 / R14508C5: '1'
## Warning: Coercing text to numeric in E14509 / R14509C5: '1'
## Warning: Coercing text to numeric in E14510 / R14510C5: '2'
## Warning: Coercing text to numeric in E14511 / R14511C5: '2'
## Warning: Coercing text to numeric in E14512 / R14512C5: '2'
## Warning: Coercing text to numeric in E14513 / R14513C5: '2'
## Warning: Coercing text to numeric in E14514 / R14514C5: '2'
## Warning: Coercing text to numeric in E14515 / R14515C5: '2'
## Warning: Coercing text to numeric in E14516 / R14516C5: '1'
## Warning: Coercing text to numeric in E14517 / R14517C5: '1'
## Warning: Coercing text to numeric in E14518 / R14518C5: '1'
## Warning: Coercing text to numeric in E14519 / R14519C5: '1'
## Warning: Coercing text to numeric in E14520 / R14520C5: '1'
## Warning: Coercing text to numeric in E14521 / R14521C5: '1'
## Warning: Coercing text to numeric in E14522 / R14522C5: '1'
## Warning: Coercing text to numeric in E14523 / R14523C5: '1'
## Warning: Coercing text to numeric in E14524 / R14524C5: '1'
## Warning: Coercing text to numeric in E14525 / R14525C5: '1'
## Warning: Coercing text to numeric in E14526 / R14526C5: '1'
## Warning: Coercing text to numeric in E14527 / R14527C5: '1'
## Warning: Coercing text to numeric in E14528 / R14528C5: '1'
## Warning: Coercing text to numeric in E14529 / R14529C5: '1'
## Warning: Coercing text to numeric in E14530 / R14530C5: '1'
## Warning: Coercing text to numeric in E14531 / R14531C5: '1'
## Warning: Coercing text to numeric in E14532 / R14532C5: '1'
## Warning: Coercing text to numeric in E14533 / R14533C5: '1'
## Warning: Coercing text to numeric in E14534 / R14534C5: '1'
## Warning: Coercing text to numeric in E14535 / R14535C5: '1'
## Warning: Coercing text to numeric in E14536 / R14536C5: '1'
## Warning: Coercing text to numeric in E14537 / R14537C5: '1'
## Warning: Coercing text to numeric in E14538 / R14538C5: '1'
## Warning: Coercing text to numeric in E14539 / R14539C5: '1'
## Warning: Coercing text to numeric in E14540 / R14540C5: '1'
## Warning: Coercing text to numeric in E14541 / R14541C5: '1'
## Warning: Coercing text to numeric in E14542 / R14542C5: '1'
## Warning: Coercing text to numeric in E14543 / R14543C5: '1'
## Warning: Coercing text to numeric in E14544 / R14544C5: '1'
## Warning: Coercing text to numeric in E14545 / R14545C5: '1'
## Warning: Coercing text to numeric in E14546 / R14546C5: '2'
## Warning: Coercing text to numeric in E14547 / R14547C5: '2'
## Warning: Coercing text to numeric in E14548 / R14548C5: '2'
## Warning: Coercing text to numeric in E14549 / R14549C5: '2'
## Warning: Coercing text to numeric in E14550 / R14550C5: '2'
## Warning: Coercing text to numeric in E14551 / R14551C5: '2'
## Warning: Coercing text to numeric in E14552 / R14552C5: '2'
## Warning: Coercing text to numeric in E14553 / R14553C5: '2'
## Warning: Coercing text to numeric in E14554 / R14554C5: '2'
## Warning: Coercing text to numeric in E14555 / R14555C5: '2'
## Warning: Coercing text to numeric in E14556 / R14556C5: '2'
## Warning: Coercing text to numeric in E14557 / R14557C5: '2'
## Warning: Coercing text to numeric in E14558 / R14558C5: '2'
## Warning: Coercing text to numeric in E14559 / R14559C5: '2'
## Warning: Coercing text to numeric in E14560 / R14560C5: '2'
## Warning: Coercing text to numeric in E14561 / R14561C5: '2'
## Warning: Coercing text to numeric in E14562 / R14562C5: '2'
## Warning: Coercing text to numeric in E14563 / R14563C5: '2'
## Warning: Coercing text to numeric in E14564 / R14564C5: '1'
## Warning: Coercing text to numeric in E14565 / R14565C5: '1'
## Warning: Coercing text to numeric in E14566 / R14566C5: '1'
## Warning: Coercing text to numeric in E14567 / R14567C5: '1'
## Warning: Coercing text to numeric in E14568 / R14568C5: '1'
## Warning: Coercing text to numeric in E14569 / R14569C5: '1'
## Warning: Coercing text to numeric in E14570 / R14570C5: '1'
## Warning: Coercing text to numeric in E14571 / R14571C5: '1'
## Warning: Coercing text to numeric in E14572 / R14572C5: '1'
## Warning: Coercing text to numeric in E14573 / R14573C5: '1'
## Warning: Coercing text to numeric in E14574 / R14574C5: '1'
## Warning: Coercing text to numeric in E14575 / R14575C5: '1'
## Warning: Coercing text to numeric in E14576 / R14576C5: '1'
## Warning: Coercing text to numeric in E14577 / R14577C5: '1'
## Warning: Coercing text to numeric in E14578 / R14578C5: '1'
## Warning: Coercing text to numeric in E14579 / R14579C5: '1'
## Warning: Coercing text to numeric in E14580 / R14580C5: '1'
## Warning: Coercing text to numeric in E14581 / R14581C5: '1'
## Warning: Coercing text to numeric in E14582 / R14582C5: '1'
## Warning: Coercing text to numeric in E14583 / R14583C5: '1'
## Warning: Coercing text to numeric in E14584 / R14584C5: '1'
## Warning: Coercing text to numeric in E14585 / R14585C5: '1'
## Warning: Coercing text to numeric in E14586 / R14586C5: '1'
## Warning: Coercing text to numeric in E14587 / R14587C5: '1'
## Warning: Coercing text to numeric in E14588 / R14588C5: '2'
## Warning: Coercing text to numeric in E14589 / R14589C5: '2'
## Warning: Coercing text to numeric in E14590 / R14590C5: '2'
## Warning: Coercing text to numeric in E14591 / R14591C5: '2'
## Warning: Coercing text to numeric in E14592 / R14592C5: '2'
## Warning: Coercing text to numeric in E14593 / R14593C5: '2'
## Warning: Coercing text to numeric in E14594 / R14594C5: '2'
## Warning: Coercing text to numeric in E14595 / R14595C5: '2'
## Warning: Coercing text to numeric in E14596 / R14596C5: '2'
## Warning: Coercing text to numeric in E14597 / R14597C5: '2'
## Warning: Coercing text to numeric in E14598 / R14598C5: '2'
## Warning: Coercing text to numeric in E14599 / R14599C5: '2'
## Warning: Coercing text to numeric in E14600 / R14600C5: '2'
## Warning: Coercing text to numeric in E14601 / R14601C5: '2'
## Warning: Coercing text to numeric in E14602 / R14602C5: '2'
## Warning: Coercing text to numeric in E14603 / R14603C5: '2'
## Warning: Coercing text to numeric in E14604 / R14604C5: '2'
## Warning: Coercing text to numeric in E14605 / R14605C5: '2'
## Warning: Coercing text to numeric in E14606 / R14606C5: '2'
## Warning: Coercing text to numeric in E14607 / R14607C5: '2'
## Warning: Coercing text to numeric in E14608 / R14608C5: '2'
## Warning: Coercing text to numeric in E14609 / R14609C5: '2'
## Warning: Coercing text to numeric in E14610 / R14610C5: '2'
## Warning: Coercing text to numeric in E14611 / R14611C5: '2'
## Warning: Coercing text to numeric in E14612 / R14612C5: '1'
## Warning: Coercing text to numeric in E14613 / R14613C5: '1'
## Warning: Coercing text to numeric in E14614 / R14614C5: '1'
## Warning: Coercing text to numeric in E14615 / R14615C5: '1'
## Warning: Coercing text to numeric in E14616 / R14616C5: '1'
## Warning: Coercing text to numeric in E14617 / R14617C5: '1'
## Warning: Coercing text to numeric in E14618 / R14618C5: '1'
## Warning: Coercing text to numeric in E14619 / R14619C5: '1'
## Warning: Coercing text to numeric in E14620 / R14620C5: '1'
## Warning: Coercing text to numeric in E14621 / R14621C5: '1'
## Warning: Coercing text to numeric in E14622 / R14622C5: '1'
## Warning: Coercing text to numeric in E14623 / R14623C5: '1'
## Warning: Coercing text to numeric in E14624 / R14624C5: '2'
## Warning: Coercing text to numeric in E14625 / R14625C5: '2'
## Warning: Coercing text to numeric in E14626 / R14626C5: '2'
## Warning: Coercing text to numeric in E14627 / R14627C5: '2'
## Warning: Coercing text to numeric in E14628 / R14628C5: '2'
## Warning: Coercing text to numeric in E14629 / R14629C5: '2'
## Warning: Coercing text to numeric in E14630 / R14630C5: '1'
## Warning: Coercing text to numeric in E14631 / R14631C5: '1'
## Warning: Coercing text to numeric in E14632 / R14632C5: '1'
## Warning: Coercing text to numeric in E14633 / R14633C5: '1'
## Warning: Coercing text to numeric in E14634 / R14634C5: '1'
## Warning: Coercing text to numeric in E14635 / R14635C5: '1'
## Warning: Coercing text to numeric in E14636 / R14636C5: '1'
## Warning: Coercing text to numeric in E14637 / R14637C5: '1'
## Warning: Coercing text to numeric in E14638 / R14638C5: '1'
## Warning: Coercing text to numeric in E14639 / R14639C5: '1'
## Warning: Coercing text to numeric in E14640 / R14640C5: '1'
## Warning: Coercing text to numeric in E14641 / R14641C5: '1'
## Warning: Coercing text to numeric in E14642 / R14642C5: '1'
## Warning: Coercing text to numeric in E14643 / R14643C5: '1'
## Warning: Coercing text to numeric in E14644 / R14644C5: '1'
## Warning: Coercing text to numeric in E14645 / R14645C5: '1'
## Warning: Coercing text to numeric in E14646 / R14646C5: '1'
## Warning: Coercing text to numeric in E14647 / R14647C5: '1'
## Warning: Coercing text to numeric in E14648 / R14648C5: '2'
## Warning: Coercing text to numeric in E14649 / R14649C5: '2'
## Warning: Coercing text to numeric in E14650 / R14650C5: '2'
## Warning: Coercing text to numeric in E14651 / R14651C5: '2'
## Warning: Coercing text to numeric in E14652 / R14652C5: '2'
## Warning: Coercing text to numeric in E14653 / R14653C5: '2'
## Warning: Coercing text to numeric in E14654 / R14654C5: '2'
## Warning: Coercing text to numeric in E14655 / R14655C5: '2'
## Warning: Coercing text to numeric in E14656 / R14656C5: '2'
## Warning: Coercing text to numeric in E14657 / R14657C5: '2'
## Warning: Coercing text to numeric in E14658 / R14658C5: '2'
## Warning: Coercing text to numeric in E14659 / R14659C5: '2'
## Warning: Coercing text to numeric in E14660 / R14660C5: '1'
## Warning: Coercing text to numeric in E14661 / R14661C5: '1'
## Warning: Coercing text to numeric in E14662 / R14662C5: '1'
## Warning: Coercing text to numeric in E14663 / R14663C5: '1'
## Warning: Coercing text to numeric in E14664 / R14664C5: '1'
## Warning: Coercing text to numeric in E14665 / R14665C5: '1'
## Warning: Coercing text to numeric in E14666 / R14666C5: '2'
## Warning: Coercing text to numeric in E14667 / R14667C5: '2'
## Warning: Coercing text to numeric in E14668 / R14668C5: '2'
## Warning: Coercing text to numeric in E14669 / R14669C5: '2'
## Warning: Coercing text to numeric in E14670 / R14670C5: '2'
## Warning: Coercing text to numeric in E14671 / R14671C5: '2'
## Warning: Coercing text to numeric in E14672 / R14672C5: '2'
## Warning: Coercing text to numeric in E14673 / R14673C5: '2'
## Warning: Coercing text to numeric in E14674 / R14674C5: '2'
## Warning: Coercing text to numeric in E14675 / R14675C5: '2'
## Warning: Coercing text to numeric in E14676 / R14676C5: '2'
## Warning: Coercing text to numeric in E14677 / R14677C5: '2'
## Warning: Coercing text to numeric in E14678 / R14678C5: '1'
## Warning: Coercing text to numeric in E14679 / R14679C5: '1'
## Warning: Coercing text to numeric in E14680 / R14680C5: '1'
## Warning: Coercing text to numeric in E14681 / R14681C5: '1'
## Warning: Coercing text to numeric in E14682 / R14682C5: '1'
## Warning: Coercing text to numeric in E14683 / R14683C5: '1'
## Warning: Coercing text to numeric in E14684 / R14684C5: '1'
## Warning: Coercing text to numeric in E14685 / R14685C5: '1'
## Warning: Coercing text to numeric in E14686 / R14686C5: '1'
## Warning: Coercing text to numeric in E14687 / R14687C5: '1'
## Warning: Coercing text to numeric in E14688 / R14688C5: '1'
## Warning: Coercing text to numeric in E14689 / R14689C5: '1'
## Warning: Coercing text to numeric in E14690 / R14690C5: '1'
## Warning: Coercing text to numeric in E14691 / R14691C5: '1'
## Warning: Coercing text to numeric in E14692 / R14692C5: '1'
## Warning: Coercing text to numeric in E14693 / R14693C5: '1'
## Warning: Coercing text to numeric in E14694 / R14694C5: '1'
## Warning: Coercing text to numeric in E14695 / R14695C5: '1'
## Warning: Coercing text to numeric in E14696 / R14696C5: '2'
## Warning: Coercing text to numeric in E14697 / R14697C5: '2'
## Warning: Coercing text to numeric in E14698 / R14698C5: '2'
## Warning: Coercing text to numeric in E14699 / R14699C5: '2'
## Warning: Coercing text to numeric in E14700 / R14700C5: '2'
## Warning: Coercing text to numeric in E14701 / R14701C5: '2'
## Warning: Coercing text to numeric in E14702 / R14702C5: '2'
## Warning: Coercing text to numeric in E14703 / R14703C5: '2'
## Warning: Coercing text to numeric in E14704 / R14704C5: '2'
## Warning: Coercing text to numeric in E14705 / R14705C5: '2'
## Warning: Coercing text to numeric in E14706 / R14706C5: '2'
## Warning: Coercing text to numeric in E14707 / R14707C5: '2'
## Warning: Coercing text to numeric in E14708 / R14708C5: '1'
## Warning: Coercing text to numeric in E14709 / R14709C5: '1'
## Warning: Coercing text to numeric in E14710 / R14710C5: '1'
## Warning: Coercing text to numeric in E14711 / R14711C5: '1'
## Warning: Coercing text to numeric in E14712 / R14712C5: '1'
## Warning: Coercing text to numeric in E14713 / R14713C5: '1'
## Warning: Coercing text to numeric in E14714 / R14714C5: '1'
## Warning: Coercing text to numeric in E14715 / R14715C5: '1'
## Warning: Coercing text to numeric in E14716 / R14716C5: '1'
## Warning: Coercing text to numeric in E14717 / R14717C5: '1'
## Warning: Coercing text to numeric in E14718 / R14718C5: '1'
## Warning: Coercing text to numeric in E14719 / R14719C5: '1'
## Warning: Coercing text to numeric in E14720 / R14720C5: '1'
## Warning: Coercing text to numeric in E14721 / R14721C5: '1'
## Warning: Coercing text to numeric in E14722 / R14722C5: '1'
## Warning: Coercing text to numeric in E14723 / R14723C5: '1'
## Warning: Coercing text to numeric in E14724 / R14724C5: '1'
## Warning: Coercing text to numeric in E14725 / R14725C5: '1'
## Warning: Coercing text to numeric in E14726 / R14726C5: '2'
## Warning: Coercing text to numeric in E14727 / R14727C5: '2'
## Warning: Coercing text to numeric in E14728 / R14728C5: '2'
## Warning: Coercing text to numeric in E14729 / R14729C5: '2'
## Warning: Coercing text to numeric in E14730 / R14730C5: '2'
## Warning: Coercing text to numeric in E14731 / R14731C5: '2'
## Warning: Coercing text to numeric in E14732 / R14732C5: '2'
## Warning: Coercing text to numeric in E14733 / R14733C5: '2'
## Warning: Coercing text to numeric in E14734 / R14734C5: '2'
## Warning: Coercing text to numeric in E14735 / R14735C5: '2'
## Warning: Coercing text to numeric in E14736 / R14736C5: '2'
## Warning: Coercing text to numeric in E14737 / R14737C5: '2'
## Warning: Coercing text to numeric in E14738 / R14738C5: '2'
## Warning: Coercing text to numeric in E14739 / R14739C5: '2'
## Warning: Coercing text to numeric in E14740 / R14740C5: '2'
## Warning: Coercing text to numeric in E14741 / R14741C5: '2'
## Warning: Coercing text to numeric in E14742 / R14742C5: '2'
## Warning: Coercing text to numeric in E14743 / R14743C5: '2'
## Warning: Coercing text to numeric in E14744 / R14744C5: '1'
## Warning: Coercing text to numeric in E14745 / R14745C5: '1'
## Warning: Coercing text to numeric in E14746 / R14746C5: '1'
## Warning: Coercing text to numeric in E14747 / R14747C5: '1'
## Warning: Coercing text to numeric in E14748 / R14748C5: '1'
## Warning: Coercing text to numeric in E14749 / R14749C5: '1'
## Warning: Coercing text to numeric in E14750 / R14750C5: '2'
## Warning: Coercing text to numeric in E14751 / R14751C5: '2'
## Warning: Coercing text to numeric in E14752 / R14752C5: '2'
## Warning: Coercing text to numeric in E14753 / R14753C5: '2'
## Warning: Coercing text to numeric in E14754 / R14754C5: '2'
## Warning: Coercing text to numeric in E14755 / R14755C5: '2'
## Warning: Coercing text to numeric in E14756 / R14756C5: '2'
## Warning: Coercing text to numeric in E14757 / R14757C5: '2'
## Warning: Coercing text to numeric in E14758 / R14758C5: '2'
## Warning: Coercing text to numeric in E14759 / R14759C5: '2'
## Warning: Coercing text to numeric in E14760 / R14760C5: '2'
## Warning: Coercing text to numeric in E14761 / R14761C5: '2'
## Warning: Coercing text to numeric in E14762 / R14762C5: '1'
## Warning: Coercing text to numeric in E14763 / R14763C5: '1'
## Warning: Coercing text to numeric in E14764 / R14764C5: '1'
## Warning: Coercing text to numeric in E14765 / R14765C5: '1'
## Warning: Coercing text to numeric in E14766 / R14766C5: '1'
## Warning: Coercing text to numeric in E14767 / R14767C5: '1'
## Warning: Coercing text to numeric in E14768 / R14768C5: '1'
## Warning: Coercing text to numeric in E14769 / R14769C5: '1'
## Warning: Coercing text to numeric in E14770 / R14770C5: '1'
## Warning: Coercing text to numeric in E14771 / R14771C5: '1'
## Warning: Coercing text to numeric in E14772 / R14772C5: '1'
## Warning: Coercing text to numeric in E14773 / R14773C5: '1'
## Warning: Coercing text to numeric in E14774 / R14774C5: '1'
## Warning: Coercing text to numeric in E14775 / R14775C5: '1'
## Warning: Coercing text to numeric in E14776 / R14776C5: '1'
## Warning: Coercing text to numeric in E14777 / R14777C5: '1'
## Warning: Coercing text to numeric in E14778 / R14778C5: '1'
## Warning: Coercing text to numeric in E14779 / R14779C5: '1'
## Warning: Coercing text to numeric in E14780 / R14780C5: '2'
## Warning: Coercing text to numeric in E14781 / R14781C5: '2'
## Warning: Coercing text to numeric in E14782 / R14782C5: '2'
## Warning: Coercing text to numeric in E14783 / R14783C5: '2'
## Warning: Coercing text to numeric in E14784 / R14784C5: '2'
## Warning: Coercing text to numeric in E14785 / R14785C5: '2'
## Warning: Coercing text to numeric in E14786 / R14786C5: '1'
## Warning: Coercing text to numeric in E14787 / R14787C5: '1'
## Warning: Coercing text to numeric in E14788 / R14788C5: '1'
## Warning: Coercing text to numeric in E14789 / R14789C5: '1'
## Warning: Coercing text to numeric in E14790 / R14790C5: '1'
## Warning: Coercing text to numeric in E14791 / R14791C5: '1'
## Warning: Coercing text to numeric in E14792 / R14792C5: '1'
## Warning: Coercing text to numeric in E14793 / R14793C5: '1'
## Warning: Coercing text to numeric in E14794 / R14794C5: '1'
## Warning: Coercing text to numeric in E14795 / R14795C5: '1'
## Warning: Coercing text to numeric in E14796 / R14796C5: '1'
## Warning: Coercing text to numeric in E14797 / R14797C5: '1'
## Warning: Coercing text to numeric in E14798 / R14798C5: '2'
## Warning: Coercing text to numeric in E14799 / R14799C5: '2'
## Warning: Coercing text to numeric in E14800 / R14800C5: '2'
## Warning: Coercing text to numeric in E14801 / R14801C5: '2'
## Warning: Coercing text to numeric in E14802 / R14802C5: '2'
## Warning: Coercing text to numeric in E14803 / R14803C5: '2'
## Warning: Coercing text to numeric in E14804 / R14804C5: '1'
## Warning: Coercing text to numeric in E14805 / R14805C5: '1'
## Warning: Coercing text to numeric in E14806 / R14806C5: '1'
## Warning: Coercing text to numeric in E14807 / R14807C5: '1'
## Warning: Coercing text to numeric in E14808 / R14808C5: '1'
## Warning: Coercing text to numeric in E14809 / R14809C5: '1'
## Warning: Coercing text to numeric in E14810 / R14810C5: '2'
## Warning: Coercing text to numeric in E14811 / R14811C5: '2'
## Warning: Coercing text to numeric in E14812 / R14812C5: '2'
## Warning: Coercing text to numeric in E14813 / R14813C5: '2'
## Warning: Coercing text to numeric in E14814 / R14814C5: '2'
## Warning: Coercing text to numeric in E14815 / R14815C5: '2'
## Warning: Coercing text to numeric in E14816 / R14816C5: '2'
## Warning: Coercing text to numeric in E14817 / R14817C5: '2'
## Warning: Coercing text to numeric in E14818 / R14818C5: '2'
## Warning: Coercing text to numeric in E14819 / R14819C5: '2'
## Warning: Coercing text to numeric in E14820 / R14820C5: '2'
## Warning: Coercing text to numeric in E14821 / R14821C5: '2'
## Warning: Coercing text to numeric in E14822 / R14822C5: '2'
## Warning: Coercing text to numeric in E14823 / R14823C5: '2'
## Warning: Coercing text to numeric in E14824 / R14824C5: '2'
## Warning: Coercing text to numeric in E14825 / R14825C5: '2'
## Warning: Coercing text to numeric in E14826 / R14826C5: '2'
## Warning: Coercing text to numeric in E14827 / R14827C5: '2'
## Warning: Coercing text to numeric in E14828 / R14828C5: '1'
## Warning: Coercing text to numeric in E14829 / R14829C5: '1'
## Warning: Coercing text to numeric in E14830 / R14830C5: '1'
## Warning: Coercing text to numeric in E14831 / R14831C5: '1'
## Warning: Coercing text to numeric in E14832 / R14832C5: '1'
## Warning: Coercing text to numeric in E14833 / R14833C5: '1'
## Warning: Coercing text to numeric in E14834 / R14834C5: '2'
## Warning: Coercing text to numeric in E14835 / R14835C5: '2'
## Warning: Coercing text to numeric in E14836 / R14836C5: '2'
## Warning: Coercing text to numeric in E14837 / R14837C5: '2'
## Warning: Coercing text to numeric in E14838 / R14838C5: '2'
## Warning: Coercing text to numeric in E14839 / R14839C5: '2'
## Warning: Coercing text to numeric in E14840 / R14840C5: '2'
## Warning: Coercing text to numeric in E14841 / R14841C5: '2'
## Warning: Coercing text to numeric in E14842 / R14842C5: '2'
## Warning: Coercing text to numeric in E14843 / R14843C5: '2'
## Warning: Coercing text to numeric in E14844 / R14844C5: '2'
## Warning: Coercing text to numeric in E14845 / R14845C5: '2'
## Warning: Coercing text to numeric in E14846 / R14846C5: '1'
## Warning: Coercing text to numeric in E14847 / R14847C5: '1'
## Warning: Coercing text to numeric in E14848 / R14848C5: '1'
## Warning: Coercing text to numeric in E14849 / R14849C5: '1'
## Warning: Coercing text to numeric in E14850 / R14850C5: '1'
## Warning: Coercing text to numeric in E14851 / R14851C5: '1'
## Warning: Coercing text to numeric in E14852 / R14852C5: '2'
## Warning: Coercing text to numeric in E14853 / R14853C5: '2'
## Warning: Coercing text to numeric in E14854 / R14854C5: '2'
## Warning: Coercing text to numeric in E14855 / R14855C5: '2'
## Warning: Coercing text to numeric in E14856 / R14856C5: '2'
## Warning: Coercing text to numeric in E14857 / R14857C5: '2'
## Warning: Coercing text to numeric in E14858 / R14858C5: '1'
## Warning: Coercing text to numeric in E14859 / R14859C5: '1'
## Warning: Coercing text to numeric in E14860 / R14860C5: '1'
## Warning: Coercing text to numeric in E14861 / R14861C5: '1'
## Warning: Coercing text to numeric in E14862 / R14862C5: '1'
## Warning: Coercing text to numeric in E14863 / R14863C5: '1'
## Warning: Coercing text to numeric in E14864 / R14864C5: '1'
## Warning: Coercing text to numeric in E14865 / R14865C5: '1'
## Warning: Coercing text to numeric in E14866 / R14866C5: '1'
## Warning: Coercing text to numeric in E14867 / R14867C5: '1'
## Warning: Coercing text to numeric in E14868 / R14868C5: '1'
## Warning: Coercing text to numeric in E14869 / R14869C5: '1'
## Warning: Coercing text to numeric in E14870 / R14870C5: '1'
## Warning: Coercing text to numeric in E14871 / R14871C5: '1'
## Warning: Coercing text to numeric in E14872 / R14872C5: '1'
## Warning: Coercing text to numeric in E14873 / R14873C5: '1'
## Warning: Coercing text to numeric in E14874 / R14874C5: '1'
## Warning: Coercing text to numeric in E14875 / R14875C5: '1'
## Warning: Coercing text to numeric in E14876 / R14876C5: '1'
## Warning: Coercing text to numeric in E14877 / R14877C5: '1'
## Warning: Coercing text to numeric in E14878 / R14878C5: '1'
## Warning: Coercing text to numeric in E14879 / R14879C5: '1'
## Warning: Coercing text to numeric in E14880 / R14880C5: '1'
## Warning: Coercing text to numeric in E14881 / R14881C5: '1'
## Warning: Coercing text to numeric in E14882 / R14882C5: '1'
## Warning: Coercing text to numeric in E14883 / R14883C5: '1'
## Warning: Coercing text to numeric in E14884 / R14884C5: '1'
## Warning: Coercing text to numeric in E14885 / R14885C5: '1'
## Warning: Coercing text to numeric in E14886 / R14886C5: '1'
## Warning: Coercing text to numeric in E14887 / R14887C5: '1'
## Warning: Coercing text to numeric in E14888 / R14888C5: '1'
## Warning: Coercing text to numeric in E14889 / R14889C5: '1'
## Warning: Coercing text to numeric in E14890 / R14890C5: '1'
## Warning: Coercing text to numeric in E14891 / R14891C5: '1'
## Warning: Coercing text to numeric in E14892 / R14892C5: '1'
## Warning: Coercing text to numeric in E14893 / R14893C5: '1'
## Warning: Coercing text to numeric in E14894 / R14894C5: '1'
## Warning: Coercing text to numeric in E14895 / R14895C5: '1'
## Warning: Coercing text to numeric in E14896 / R14896C5: '1'
## Warning: Coercing text to numeric in E14897 / R14897C5: '1'
## Warning: Coercing text to numeric in E14898 / R14898C5: '1'
## Warning: Coercing text to numeric in E14899 / R14899C5: '1'
## Warning: Coercing text to numeric in E14900 / R14900C5: '2'
## Warning: Coercing text to numeric in E14901 / R14901C5: '2'
## Warning: Coercing text to numeric in E14902 / R14902C5: '2'
## Warning: Coercing text to numeric in E14903 / R14903C5: '2'
## Warning: Coercing text to numeric in E14904 / R14904C5: '2'
## Warning: Coercing text to numeric in E14905 / R14905C5: '2'
## Warning: Coercing text to numeric in E14906 / R14906C5: '2'
## Warning: Coercing text to numeric in E14907 / R14907C5: '2'
## Warning: Coercing text to numeric in E14908 / R14908C5: '2'
## Warning: Coercing text to numeric in E14909 / R14909C5: '2'
## Warning: Coercing text to numeric in E14910 / R14910C5: '2'
## Warning: Coercing text to numeric in E14911 / R14911C5: '2'
## Warning: Coercing text to numeric in E14912 / R14912C5: '2'
## Warning: Coercing text to numeric in E14913 / R14913C5: '2'
## Warning: Coercing text to numeric in E14914 / R14914C5: '2'
## Warning: Coercing text to numeric in E14915 / R14915C5: '2'
## Warning: Coercing text to numeric in E14916 / R14916C5: '2'
## Warning: Coercing text to numeric in E14917 / R14917C5: '2'
## Warning: Coercing text to numeric in E14918 / R14918C5: '2'
## Warning: Coercing text to numeric in E14919 / R14919C5: '2'
## Warning: Coercing text to numeric in E14920 / R14920C5: '2'
## Warning: Coercing text to numeric in E14921 / R14921C5: '2'
## Warning: Coercing text to numeric in E14922 / R14922C5: '2'
## Warning: Coercing text to numeric in E14923 / R14923C5: '2'
## Warning: Coercing text to numeric in E14924 / R14924C5: '1'
## Warning: Coercing text to numeric in E14925 / R14925C5: '1'
## Warning: Coercing text to numeric in E14926 / R14926C5: '1'
## Warning: Coercing text to numeric in E14927 / R14927C5: '1'
## Warning: Coercing text to numeric in E14928 / R14928C5: '1'
## Warning: Coercing text to numeric in E14929 / R14929C5: '1'
## Warning: Coercing text to numeric in E14930 / R14930C5: '1'
## Warning: Coercing text to numeric in E14931 / R14931C5: '1'
## Warning: Coercing text to numeric in E14932 / R14932C5: '1'
## Warning: Coercing text to numeric in E14933 / R14933C5: '1'
## Warning: Coercing text to numeric in E14934 / R14934C5: '1'
## Warning: Coercing text to numeric in E14935 / R14935C5: '1'
## Warning: Coercing text to numeric in E14936 / R14936C5: '1'
## Warning: Coercing text to numeric in E14937 / R14937C5: '1'
## Warning: Coercing text to numeric in E14938 / R14938C5: '1'
## Warning: Coercing text to numeric in E14939 / R14939C5: '1'
## Warning: Coercing text to numeric in E14940 / R14940C5: '1'
## Warning: Coercing text to numeric in E14941 / R14941C5: '1'
## Warning: Coercing text to numeric in E14942 / R14942C5: '2'
## Warning: Coercing text to numeric in E14943 / R14943C5: '2'
## Warning: Coercing text to numeric in E14944 / R14944C5: '2'
## Warning: Coercing text to numeric in E14945 / R14945C5: '2'
## Warning: Coercing text to numeric in E14946 / R14946C5: '2'
## Warning: Coercing text to numeric in E14947 / R14947C5: '2'
## Warning: Coercing text to numeric in E14948 / R14948C5: '2'
## Warning: Coercing text to numeric in E14949 / R14949C5: '2'
## Warning: Coercing text to numeric in E14950 / R14950C5: '2'
## Warning: Coercing text to numeric in E14951 / R14951C5: '2'
## Warning: Coercing text to numeric in E14952 / R14952C5: '2'
## Warning: Coercing text to numeric in E14953 / R14953C5: '2'
## Warning: Coercing text to numeric in E14954 / R14954C5: '1'
## Warning: Coercing text to numeric in E14955 / R14955C5: '1'
## Warning: Coercing text to numeric in E14956 / R14956C5: '1'
## Warning: Coercing text to numeric in E14957 / R14957C5: '1'
## Warning: Coercing text to numeric in E14958 / R14958C5: '1'
## Warning: Coercing text to numeric in E14959 / R14959C5: '1'
## Warning: Coercing text to numeric in E14960 / R14960C5: '2'
## Warning: Coercing text to numeric in E14961 / R14961C5: '2'
## Warning: Coercing text to numeric in E14962 / R14962C5: '2'
## Warning: Coercing text to numeric in E14963 / R14963C5: '2'
## Warning: Coercing text to numeric in E14964 / R14964C5: '2'
## Warning: Coercing text to numeric in E14965 / R14965C5: '2'
## Warning: Coercing text to numeric in E14966 / R14966C5: '1'
## Warning: Coercing text to numeric in E14967 / R14967C5: '1'
## Warning: Coercing text to numeric in E14968 / R14968C5: '1'
## Warning: Coercing text to numeric in E14969 / R14969C5: '1'
## Warning: Coercing text to numeric in E14970 / R14970C5: '1'
## Warning: Coercing text to numeric in E14971 / R14971C5: '1'
## Warning: Coercing text to numeric in E14972 / R14972C5: '2'
## Warning: Coercing text to numeric in E14973 / R14973C5: '2'
## Warning: Coercing text to numeric in E14974 / R14974C5: '2'
## Warning: Coercing text to numeric in E14975 / R14975C5: '2'
## Warning: Coercing text to numeric in E14976 / R14976C5: '2'
## Warning: Coercing text to numeric in E14977 / R14977C5: '2'
## Warning: Coercing text to numeric in E14978 / R14978C5: '1'
## Warning: Coercing text to numeric in E14979 / R14979C5: '1'
## Warning: Coercing text to numeric in E14980 / R14980C5: '1'
## Warning: Coercing text to numeric in E14981 / R14981C5: '1'
## Warning: Coercing text to numeric in E14982 / R14982C5: '1'
## Warning: Coercing text to numeric in E14983 / R14983C5: '1'
## Warning: Coercing text to numeric in E14984 / R14984C5: '1'
## Warning: Coercing text to numeric in E14985 / R14985C5: '1'
## Warning: Coercing text to numeric in E14986 / R14986C5: '1'
## Warning: Coercing text to numeric in E14987 / R14987C5: '1'
## Warning: Coercing text to numeric in E14988 / R14988C5: '1'
## Warning: Coercing text to numeric in E14989 / R14989C5: '1'
## Warning: Coercing text to numeric in E14990 / R14990C5: '1'
## Warning: Coercing text to numeric in E14991 / R14991C5: '1'
## Warning: Coercing text to numeric in E14992 / R14992C5: '1'
## Warning: Coercing text to numeric in E14993 / R14993C5: '1'
## Warning: Coercing text to numeric in E14994 / R14994C5: '1'
## Warning: Coercing text to numeric in E14995 / R14995C5: '1'
## Warning: Coercing text to numeric in E14996 / R14996C5: '1'
## Warning: Coercing text to numeric in E14997 / R14997C5: '1'
## Warning: Coercing text to numeric in E14998 / R14998C5: '1'
## Warning: Coercing text to numeric in E14999 / R14999C5: '1'
## Warning: Coercing text to numeric in E15000 / R15000C5: '1'
## Warning: Coercing text to numeric in E15001 / R15001C5: '1'
## Warning: Coercing text to numeric in E15002 / R15002C5: '1'
## Warning: Coercing text to numeric in E15003 / R15003C5: '1'
## Warning: Coercing text to numeric in E15004 / R15004C5: '1'
## Warning: Coercing text to numeric in E15005 / R15005C5: '1'
## Warning: Coercing text to numeric in E15006 / R15006C5: '1'
## Warning: Coercing text to numeric in E15007 / R15007C5: '1'
## Warning: Coercing text to numeric in E15008 / R15008C5: '1'
## Warning: Coercing text to numeric in E15009 / R15009C5: '1'
## Warning: Coercing text to numeric in E15010 / R15010C5: '1'
## Warning: Coercing text to numeric in E15011 / R15011C5: '1'
## Warning: Coercing text to numeric in E15012 / R15012C5: '1'
## Warning: Coercing text to numeric in E15013 / R15013C5: '1'
## Warning: Coercing text to numeric in E15014 / R15014C5: '2'
## Warning: Coercing text to numeric in E15015 / R15015C5: '2'
## Warning: Coercing text to numeric in E15016 / R15016C5: '2'
## Warning: Coercing text to numeric in E15017 / R15017C5: '2'
## Warning: Coercing text to numeric in E15018 / R15018C5: '2'
## Warning: Coercing text to numeric in E15019 / R15019C5: '2'
## Warning: Coercing text to numeric in E15020 / R15020C5: '2'
## Warning: Coercing text to numeric in E15021 / R15021C5: '2'
## Warning: Coercing text to numeric in E15022 / R15022C5: '2'
## Warning: Coercing text to numeric in E15023 / R15023C5: '2'
## Warning: Coercing text to numeric in E15024 / R15024C5: '2'
## Warning: Coercing text to numeric in E15025 / R15025C5: '2'
## Warning: Coercing text to numeric in E15026 / R15026C5: '1'
## Warning: Coercing text to numeric in E15027 / R15027C5: '1'
## Warning: Coercing text to numeric in E15028 / R15028C5: '1'
## Warning: Coercing text to numeric in E15029 / R15029C5: '1'
## Warning: Coercing text to numeric in E15030 / R15030C5: '1'
## Warning: Coercing text to numeric in E15031 / R15031C5: '1'
## Warning: Coercing text to numeric in E15032 / R15032C5: '1'
## Warning: Coercing text to numeric in E15033 / R15033C5: '1'
## Warning: Coercing text to numeric in E15034 / R15034C5: '1'
## Warning: Coercing text to numeric in E15035 / R15035C5: '1'
## Warning: Coercing text to numeric in E15036 / R15036C5: '1'
## Warning: Coercing text to numeric in E15037 / R15037C5: '1'
## Warning: Coercing text to numeric in E15038 / R15038C5: '2'
## Warning: Coercing text to numeric in E15039 / R15039C5: '2'
## Warning: Coercing text to numeric in E15040 / R15040C5: '2'
## Warning: Coercing text to numeric in E15041 / R15041C5: '2'
## Warning: Coercing text to numeric in E15042 / R15042C5: '2'
## Warning: Coercing text to numeric in E15043 / R15043C5: '2'
## Warning: Coercing text to numeric in E15044 / R15044C5: '2'
## Warning: Coercing text to numeric in E15045 / R15045C5: '2'
## Warning: Coercing text to numeric in E15046 / R15046C5: '2'
## Warning: Coercing text to numeric in E15047 / R15047C5: '2'
## Warning: Coercing text to numeric in E15048 / R15048C5: '2'
## Warning: Coercing text to numeric in E15049 / R15049C5: '2'
## Warning: Coercing text to numeric in E15050 / R15050C5: '1'
## Warning: Coercing text to numeric in E15051 / R15051C5: '1'
## Warning: Coercing text to numeric in E15052 / R15052C5: '1'
## Warning: Coercing text to numeric in E15053 / R15053C5: '1'
## Warning: Coercing text to numeric in E15054 / R15054C5: '1'
## Warning: Coercing text to numeric in E15055 / R15055C5: '1'
## Warning: Coercing text to numeric in E15056 / R15056C5: '2'
## Warning: Coercing text to numeric in E15057 / R15057C5: '2'
## Warning: Coercing text to numeric in E15058 / R15058C5: '2'
## Warning: Coercing text to numeric in E15059 / R15059C5: '2'
## Warning: Coercing text to numeric in E15060 / R15060C5: '2'
## Warning: Coercing text to numeric in E15061 / R15061C5: '2'
## Warning: Coercing text to numeric in E15062 / R15062C5: '1'
## Warning: Coercing text to numeric in E15063 / R15063C5: '1'
## Warning: Coercing text to numeric in E15064 / R15064C5: '1'
## Warning: Coercing text to numeric in E15065 / R15065C5: '1'
## Warning: Coercing text to numeric in E15066 / R15066C5: '1'
## Warning: Coercing text to numeric in E15067 / R15067C5: '1'
## Warning: Coercing text to numeric in E15068 / R15068C5: '1'
## Warning: Coercing text to numeric in E15069 / R15069C5: '1'
## Warning: Coercing text to numeric in E15070 / R15070C5: '1'
## Warning: Coercing text to numeric in E15071 / R15071C5: '1'
## Warning: Coercing text to numeric in E15072 / R15072C5: '1'
## Warning: Coercing text to numeric in E15073 / R15073C5: '1'
## Warning: Coercing text to numeric in E15074 / R15074C5: '1'
## Warning: Coercing text to numeric in E15075 / R15075C5: '1'
## Warning: Coercing text to numeric in E15076 / R15076C5: '1'
## Warning: Coercing text to numeric in E15077 / R15077C5: '1'
## Warning: Coercing text to numeric in E15078 / R15078C5: '1'
## Warning: Coercing text to numeric in E15079 / R15079C5: '1'
## Warning: Coercing text to numeric in E15080 / R15080C5: '2'
## Warning: Coercing text to numeric in E15081 / R15081C5: '2'
## Warning: Coercing text to numeric in E15082 / R15082C5: '2'
## Warning: Coercing text to numeric in E15083 / R15083C5: '2'
## Warning: Coercing text to numeric in E15084 / R15084C5: '2'
## Warning: Coercing text to numeric in E15085 / R15085C5: '2'
## Warning: Coercing text to numeric in E15086 / R15086C5: '2'
## Warning: Coercing text to numeric in E15087 / R15087C5: '2'
## Warning: Coercing text to numeric in E15088 / R15088C5: '2'
## Warning: Coercing text to numeric in E15089 / R15089C5: '2'
## Warning: Coercing text to numeric in E15090 / R15090C5: '2'
## Warning: Coercing text to numeric in E15091 / R15091C5: '2'
## Warning: Coercing text to numeric in E15092 / R15092C5: '2'
## Warning: Coercing text to numeric in E15093 / R15093C5: '2'
## Warning: Coercing text to numeric in E15094 / R15094C5: '2'
## Warning: Coercing text to numeric in E15095 / R15095C5: '2'
## Warning: Coercing text to numeric in E15096 / R15096C5: '2'
## Warning: Coercing text to numeric in E15097 / R15097C5: '2'
## Warning: Coercing text to numeric in E15098 / R15098C5: '2'
## Warning: Coercing text to numeric in E15099 / R15099C5: '2'
## Warning: Coercing text to numeric in E15100 / R15100C5: '2'
## Warning: Coercing text to numeric in E15101 / R15101C5: '2'
## Warning: Coercing text to numeric in E15102 / R15102C5: '2'
## Warning: Coercing text to numeric in E15103 / R15103C5: '2'
## Warning: Coercing text to numeric in E15104 / R15104C5: '2'
## Warning: Coercing text to numeric in E15105 / R15105C5: '2'
## Warning: Coercing text to numeric in E15106 / R15106C5: '2'
## Warning: Coercing text to numeric in E15107 / R15107C5: '2'
## Warning: Coercing text to numeric in E15108 / R15108C5: '2'
## Warning: Coercing text to numeric in E15109 / R15109C5: '2'
## Warning: Coercing text to numeric in E15110 / R15110C5: '2'
## Warning: Coercing text to numeric in E15111 / R15111C5: '2'
## Warning: Coercing text to numeric in E15112 / R15112C5: '2'
## Warning: Coercing text to numeric in E15113 / R15113C5: '2'
## Warning: Coercing text to numeric in E15114 / R15114C5: '2'
## Warning: Coercing text to numeric in E15115 / R15115C5: '2'
## Warning: Coercing text to numeric in E15116 / R15116C5: '1'
## Warning: Coercing text to numeric in E15117 / R15117C5: '1'
## Warning: Coercing text to numeric in E15118 / R15118C5: '1'
## Warning: Coercing text to numeric in E15119 / R15119C5: '1'
## Warning: Coercing text to numeric in E15120 / R15120C5: '1'
## Warning: Coercing text to numeric in E15121 / R15121C5: '1'
## Warning: Coercing text to numeric in E15122 / R15122C5: '2'
## Warning: Coercing text to numeric in E15123 / R15123C5: '2'
## Warning: Coercing text to numeric in E15124 / R15124C5: '2'
## Warning: Coercing text to numeric in E15125 / R15125C5: '2'
## Warning: Coercing text to numeric in E15126 / R15126C5: '2'
## Warning: Coercing text to numeric in E15127 / R15127C5: '2'
## Warning: Coercing text to numeric in E15128 / R15128C5: '2'
## Warning: Coercing text to numeric in E15129 / R15129C5: '2'
## Warning: Coercing text to numeric in E15130 / R15130C5: '2'
## Warning: Coercing text to numeric in E15131 / R15131C5: '2'
## Warning: Coercing text to numeric in E15132 / R15132C5: '2'
## Warning: Coercing text to numeric in E15133 / R15133C5: '2'
## Warning: Coercing text to numeric in E15134 / R15134C5: '1'
## Warning: Coercing text to numeric in E15135 / R15135C5: '1'
## Warning: Coercing text to numeric in E15136 / R15136C5: '1'
## Warning: Coercing text to numeric in E15137 / R15137C5: '1'
## Warning: Coercing text to numeric in E15138 / R15138C5: '1'
## Warning: Coercing text to numeric in E15139 / R15139C5: '1'
## Warning: Coercing text to numeric in E15140 / R15140C5: '1'
## Warning: Coercing text to numeric in E15141 / R15141C5: '1'
## Warning: Coercing text to numeric in E15142 / R15142C5: '1'
## Warning: Coercing text to numeric in E15143 / R15143C5: '1'
## Warning: Coercing text to numeric in E15144 / R15144C5: '1'
## Warning: Coercing text to numeric in E15145 / R15145C5: '1'
## Warning: Coercing text to numeric in E15146 / R15146C5: '1'
## Warning: Coercing text to numeric in E15147 / R15147C5: '1'
## Warning: Coercing text to numeric in E15148 / R15148C5: '1'
## Warning: Coercing text to numeric in E15149 / R15149C5: '1'
## Warning: Coercing text to numeric in E15150 / R15150C5: '1'
## Warning: Coercing text to numeric in E15151 / R15151C5: '1'
## Warning: Coercing text to numeric in E15152 / R15152C5: '1'
## Warning: Coercing text to numeric in E15153 / R15153C5: '1'
## Warning: Coercing text to numeric in E15154 / R15154C5: '1'
## Warning: Coercing text to numeric in E15155 / R15155C5: '1'
## Warning: Coercing text to numeric in E15156 / R15156C5: '1'
## Warning: Coercing text to numeric in E15157 / R15157C5: '1'
## Warning: Coercing text to numeric in E15158 / R15158C5: '1'
## Warning: Coercing text to numeric in E15159 / R15159C5: '1'
## Warning: Coercing text to numeric in E15160 / R15160C5: '1'
## Warning: Coercing text to numeric in E15161 / R15161C5: '1'
## Warning: Coercing text to numeric in E15162 / R15162C5: '1'
## Warning: Coercing text to numeric in E15163 / R15163C5: '1'
## Warning: Coercing text to numeric in E15164 / R15164C5: '1'
## Warning: Coercing text to numeric in E15165 / R15165C5: '1'
## Warning: Coercing text to numeric in E15166 / R15166C5: '1'
## Warning: Coercing text to numeric in E15167 / R15167C5: '1'
## Warning: Coercing text to numeric in E15168 / R15168C5: '1'
## Warning: Coercing text to numeric in E15169 / R15169C5: '1'
## Warning: Coercing text to numeric in E15170 / R15170C5: '1'
## Warning: Coercing text to numeric in E15171 / R15171C5: '1'
## Warning: Coercing text to numeric in E15172 / R15172C5: '1'
## Warning: Coercing text to numeric in E15173 / R15173C5: '1'
## Warning: Coercing text to numeric in E15174 / R15174C5: '1'
## Warning: Coercing text to numeric in E15175 / R15175C5: '1'
## Warning: Coercing text to numeric in E15176 / R15176C5: '1'
## Warning: Coercing text to numeric in E15177 / R15177C5: '1'
## Warning: Coercing text to numeric in E15178 / R15178C5: '1'
## Warning: Coercing text to numeric in E15179 / R15179C5: '1'
## Warning: Coercing text to numeric in E15180 / R15180C5: '1'
## Warning: Coercing text to numeric in E15181 / R15181C5: '1'
## Warning: Coercing text to numeric in E15182 / R15182C5: '1'
## Warning: Coercing text to numeric in E15183 / R15183C5: '1'
## Warning: Coercing text to numeric in E15184 / R15184C5: '1'
## Warning: Coercing text to numeric in E15185 / R15185C5: '1'
## Warning: Coercing text to numeric in E15186 / R15186C5: '1'
## Warning: Coercing text to numeric in E15187 / R15187C5: '1'
## Warning: Coercing text to numeric in E15188 / R15188C5: '1'
## Warning: Coercing text to numeric in E15189 / R15189C5: '1'
## Warning: Coercing text to numeric in E15190 / R15190C5: '1'
## Warning: Coercing text to numeric in E15191 / R15191C5: '1'
## Warning: Coercing text to numeric in E15192 / R15192C5: '1'
## Warning: Coercing text to numeric in E15193 / R15193C5: '1'
## Warning: Coercing text to numeric in E15194 / R15194C5: '1'
## Warning: Coercing text to numeric in E15195 / R15195C5: '1'
## Warning: Coercing text to numeric in E15196 / R15196C5: '1'
## Warning: Coercing text to numeric in E15197 / R15197C5: '1'
## Warning: Coercing text to numeric in E15198 / R15198C5: '1'
## Warning: Coercing text to numeric in E15199 / R15199C5: '1'
## Warning: Coercing text to numeric in E15200 / R15200C5: '1'
## Warning: Coercing text to numeric in E15201 / R15201C5: '1'
## Warning: Coercing text to numeric in E15202 / R15202C5: '1'
## Warning: Coercing text to numeric in E15203 / R15203C5: '1'
## Warning: Coercing text to numeric in E15204 / R15204C5: '1'
## Warning: Coercing text to numeric in E15205 / R15205C5: '1'
## Warning: Coercing text to numeric in E15206 / R15206C5: '1'
## Warning: Coercing text to numeric in E15207 / R15207C5: '1'
## Warning: Coercing text to numeric in E15208 / R15208C5: '1'
## Warning: Coercing text to numeric in E15209 / R15209C5: '1'
## Warning: Coercing text to numeric in E15210 / R15210C5: '1'
## Warning: Coercing text to numeric in E15211 / R15211C5: '1'
## Warning: Coercing text to numeric in E15212 / R15212C5: '1'
## Warning: Coercing text to numeric in E15213 / R15213C5: '1'
## Warning: Coercing text to numeric in E15214 / R15214C5: '1'
## Warning: Coercing text to numeric in E15215 / R15215C5: '1'
## Warning: Coercing text to numeric in E15216 / R15216C5: '1'
## Warning: Coercing text to numeric in E15217 / R15217C5: '1'
## Warning: Coercing text to numeric in E15218 / R15218C5: '1'
## Warning: Coercing text to numeric in E15219 / R15219C5: '1'
## Warning: Coercing text to numeric in E15220 / R15220C5: '1'
## Warning: Coercing text to numeric in E15221 / R15221C5: '1'
## Warning: Coercing text to numeric in E15222 / R15222C5: '1'
## Warning: Coercing text to numeric in E15223 / R15223C5: '1'
## Warning: Coercing text to numeric in E15224 / R15224C5: '2'
## Warning: Coercing text to numeric in E15225 / R15225C5: '2'
## Warning: Coercing text to numeric in E15226 / R15226C5: '2'
## Warning: Coercing text to numeric in E15227 / R15227C5: '2'
## Warning: Coercing text to numeric in E15228 / R15228C5: '2'
## Warning: Coercing text to numeric in E15229 / R15229C5: '2'
## Warning: Coercing text to numeric in E15230 / R15230C5: '2'
## Warning: Coercing text to numeric in E15231 / R15231C5: '2'
## Warning: Coercing text to numeric in E15232 / R15232C5: '2'
## Warning: Coercing text to numeric in E15233 / R15233C5: '2'
## Warning: Coercing text to numeric in E15234 / R15234C5: '2'
## Warning: Coercing text to numeric in E15235 / R15235C5: '2'
## Warning: Coercing text to numeric in E15236 / R15236C5: '1'
## Warning: Coercing text to numeric in E15237 / R15237C5: '1'
## Warning: Coercing text to numeric in E15238 / R15238C5: '1'
## Warning: Coercing text to numeric in E15239 / R15239C5: '1'
## Warning: Coercing text to numeric in E15240 / R15240C5: '1'
## Warning: Coercing text to numeric in E15241 / R15241C5: '1'
## Warning: Coercing text to numeric in E15242 / R15242C5: '2'
## Warning: Coercing text to numeric in E15243 / R15243C5: '2'
## Warning: Coercing text to numeric in E15244 / R15244C5: '2'
## Warning: Coercing text to numeric in E15245 / R15245C5: '2'
## Warning: Coercing text to numeric in E15246 / R15246C5: '2'
## Warning: Coercing text to numeric in E15247 / R15247C5: '2'
## Warning: Coercing text to numeric in E15248 / R15248C5: '1'
## Warning: Coercing text to numeric in E15249 / R15249C5: '1'
## Warning: Coercing text to numeric in E15250 / R15250C5: '1'
## Warning: Coercing text to numeric in E15251 / R15251C5: '1'
## Warning: Coercing text to numeric in E15252 / R15252C5: '1'
## Warning: Coercing text to numeric in E15253 / R15253C5: '1'
## Warning: Coercing text to numeric in E15254 / R15254C5: '2'
## Warning: Coercing text to numeric in E15255 / R15255C5: '2'
## Warning: Coercing text to numeric in E15256 / R15256C5: '2'
## Warning: Coercing text to numeric in E15257 / R15257C5: '2'
## Warning: Coercing text to numeric in E15258 / R15258C5: '2'
## Warning: Coercing text to numeric in E15259 / R15259C5: '2'
## Warning: Coercing text to numeric in E15260 / R15260C5: '2'
## Warning: Coercing text to numeric in E15261 / R15261C5: '2'
## Warning: Coercing text to numeric in E15262 / R15262C5: '2'
## Warning: Coercing text to numeric in E15263 / R15263C5: '2'
## Warning: Coercing text to numeric in E15264 / R15264C5: '2'
## Warning: Coercing text to numeric in E15265 / R15265C5: '2'
## Warning: Coercing text to numeric in E15266 / R15266C5: '2'
## Warning: Coercing text to numeric in E15267 / R15267C5: '2'
## Warning: Coercing text to numeric in E15268 / R15268C5: '2'
## Warning: Coercing text to numeric in E15269 / R15269C5: '2'
## Warning: Coercing text to numeric in E15270 / R15270C5: '2'
## Warning: Coercing text to numeric in E15271 / R15271C5: '2'
## Warning: Coercing text to numeric in E15272 / R15272C5: '2'
## Warning: Coercing text to numeric in E15273 / R15273C5: '2'
## Warning: Coercing text to numeric in E15274 / R15274C5: '2'
## Warning: Coercing text to numeric in E15275 / R15275C5: '2'
## Warning: Coercing text to numeric in E15276 / R15276C5: '2'
## Warning: Coercing text to numeric in E15277 / R15277C5: '2'
## Warning: Coercing text to numeric in E15278 / R15278C5: '1'
## Warning: Coercing text to numeric in E15279 / R15279C5: '1'
## Warning: Coercing text to numeric in E15280 / R15280C5: '1'
## Warning: Coercing text to numeric in E15281 / R15281C5: '1'
## Warning: Coercing text to numeric in E15282 / R15282C5: '1'
## Warning: Coercing text to numeric in E15283 / R15283C5: '1'
## Warning: Coercing text to numeric in E15284 / R15284C5: '1'
## Warning: Coercing text to numeric in E15285 / R15285C5: '1'
## Warning: Coercing text to numeric in E15286 / R15286C5: '1'
## Warning: Coercing text to numeric in E15287 / R15287C5: '1'
## Warning: Coercing text to numeric in E15288 / R15288C5: '1'
## Warning: Coercing text to numeric in E15289 / R15289C5: '1'
## Warning: Coercing text to numeric in E15290 / R15290C5: '1'
## Warning: Coercing text to numeric in E15291 / R15291C5: '1'
## Warning: Coercing text to numeric in E15292 / R15292C5: '1'
## Warning: Coercing text to numeric in E15293 / R15293C5: '1'
## Warning: Coercing text to numeric in E15294 / R15294C5: '1'
## Warning: Coercing text to numeric in E15295 / R15295C5: '1'
## Warning: Coercing text to numeric in E15296 / R15296C5: '2'
## Warning: Coercing text to numeric in E15297 / R15297C5: '2'
## Warning: Coercing text to numeric in E15298 / R15298C5: '2'
## Warning: Coercing text to numeric in E15299 / R15299C5: '2'
## Warning: Coercing text to numeric in E15300 / R15300C5: '2'
## Warning: Coercing text to numeric in E15301 / R15301C5: '2'
## Warning: Coercing text to numeric in E15302 / R15302C5: '1'
## Warning: Coercing text to numeric in E15303 / R15303C5: '1'
## Warning: Coercing text to numeric in E15304 / R15304C5: '1'
## Warning: Coercing text to numeric in E15305 / R15305C5: '1'
## Warning: Coercing text to numeric in E15306 / R15306C5: '1'
## Warning: Coercing text to numeric in E15307 / R15307C5: '1'
## Warning: Coercing text to numeric in E15308 / R15308C5: '1'
## Warning: Coercing text to numeric in E15309 / R15309C5: '1'
## Warning: Coercing text to numeric in E15310 / R15310C5: '1'
## Warning: Coercing text to numeric in E15311 / R15311C5: '1'
## Warning: Coercing text to numeric in E15312 / R15312C5: '1'
## Warning: Coercing text to numeric in E15313 / R15313C5: '1'
## Warning: Coercing text to numeric in E15314 / R15314C5: '1'
## Warning: Coercing text to numeric in E15315 / R15315C5: '1'
## Warning: Coercing text to numeric in E15316 / R15316C5: '1'
## Warning: Coercing text to numeric in E15317 / R15317C5: '1'
## Warning: Coercing text to numeric in E15318 / R15318C5: '1'
## Warning: Coercing text to numeric in E15319 / R15319C5: '1'
## Warning: Coercing text to numeric in E15320 / R15320C5: '2'
## Warning: Coercing text to numeric in E15321 / R15321C5: '2'
## Warning: Coercing text to numeric in E15322 / R15322C5: '2'
## Warning: Coercing text to numeric in E15323 / R15323C5: '2'
## Warning: Coercing text to numeric in E15324 / R15324C5: '2'
## Warning: Coercing text to numeric in E15325 / R15325C5: '2'
## Warning: Coercing text to numeric in E15326 / R15326C5: '2'
## Warning: Coercing text to numeric in E15327 / R15327C5: '2'
## Warning: Coercing text to numeric in E15328 / R15328C5: '2'
## Warning: Coercing text to numeric in E15329 / R15329C5: '2'
## Warning: Coercing text to numeric in E15330 / R15330C5: '2'
## Warning: Coercing text to numeric in E15331 / R15331C5: '2'
## Warning: Coercing text to numeric in E15332 / R15332C5: '2'
## Warning: Coercing text to numeric in E15333 / R15333C5: '2'
## Warning: Coercing text to numeric in E15334 / R15334C5: '2'
## Warning: Coercing text to numeric in E15335 / R15335C5: '2'
## Warning: Coercing text to numeric in E15336 / R15336C5: '2'
## Warning: Coercing text to numeric in E15337 / R15337C5: '2'
## Warning: Coercing text to numeric in E15338 / R15338C5: '1'
## Warning: Coercing text to numeric in E15339 / R15339C5: '1'
## Warning: Coercing text to numeric in E15340 / R15340C5: '1'
## Warning: Coercing text to numeric in E15341 / R15341C5: '1'
## Warning: Coercing text to numeric in E15342 / R15342C5: '1'
## Warning: Coercing text to numeric in E15343 / R15343C5: '1'
## Warning: Coercing text to numeric in E15344 / R15344C5: '1'
## Warning: Coercing text to numeric in E15345 / R15345C5: '1'
## Warning: Coercing text to numeric in E15346 / R15346C5: '1'
## Warning: Coercing text to numeric in E15347 / R15347C5: '1'
## Warning: Coercing text to numeric in E15348 / R15348C5: '1'
## Warning: Coercing text to numeric in E15349 / R15349C5: '1'
## Warning: Coercing text to numeric in E15350 / R15350C5: '2'
## Warning: Coercing text to numeric in E15351 / R15351C5: '2'
## Warning: Coercing text to numeric in E15352 / R15352C5: '2'
## Warning: Coercing text to numeric in E15353 / R15353C5: '2'
## Warning: Coercing text to numeric in E15354 / R15354C5: '2'
## Warning: Coercing text to numeric in E15355 / R15355C5: '2'
## Warning: Coercing text to numeric in E15356 / R15356C5: '1'
## Warning: Coercing text to numeric in E15357 / R15357C5: '1'
## Warning: Coercing text to numeric in E15358 / R15358C5: '1'
## Warning: Coercing text to numeric in E15359 / R15359C5: '1'
## Warning: Coercing text to numeric in E15360 / R15360C5: '1'
## Warning: Coercing text to numeric in E15361 / R15361C5: '1'
## Warning: Coercing text to numeric in E15362 / R15362C5: '2'
## Warning: Coercing text to numeric in E15363 / R15363C5: '2'
## Warning: Coercing text to numeric in E15364 / R15364C5: '2'
## Warning: Coercing text to numeric in E15365 / R15365C5: '2'
## Warning: Coercing text to numeric in E15366 / R15366C5: '2'
## Warning: Coercing text to numeric in E15367 / R15367C5: '2'
## Warning: Coercing text to numeric in E15368 / R15368C5: '2'
## Warning: Coercing text to numeric in E15369 / R15369C5: '2'
## Warning: Coercing text to numeric in E15370 / R15370C5: '2'
## Warning: Coercing text to numeric in E15371 / R15371C5: '2'
## Warning: Coercing text to numeric in E15372 / R15372C5: '2'
## Warning: Coercing text to numeric in E15373 / R15373C5: '2'
## Warning: Coercing text to numeric in E15374 / R15374C5: '1'
## Warning: Coercing text to numeric in E15375 / R15375C5: '1'
## Warning: Coercing text to numeric in E15376 / R15376C5: '1'
## Warning: Coercing text to numeric in E15377 / R15377C5: '1'
## Warning: Coercing text to numeric in E15378 / R15378C5: '1'
## Warning: Coercing text to numeric in E15379 / R15379C5: '1'
## Warning: Coercing text to numeric in E15380 / R15380C5: '1'
## Warning: Coercing text to numeric in E15381 / R15381C5: '1'
## Warning: Coercing text to numeric in E15382 / R15382C5: '1'
## Warning: Coercing text to numeric in E15383 / R15383C5: '1'
## Warning: Coercing text to numeric in E15384 / R15384C5: '1'
## Warning: Coercing text to numeric in E15385 / R15385C5: '1'
## Warning: Coercing text to numeric in E15386 / R15386C5: '2'
## Warning: Coercing text to numeric in E15387 / R15387C5: '2'
## Warning: Coercing text to numeric in E15388 / R15388C5: '2'
## Warning: Coercing text to numeric in E15389 / R15389C5: '2'
## Warning: Coercing text to numeric in E15390 / R15390C5: '2'
## Warning: Coercing text to numeric in E15391 / R15391C5: '2'
## Warning: Coercing text to numeric in E15392 / R15392C5: '2'
## Warning: Coercing text to numeric in E15393 / R15393C5: '2'
## Warning: Coercing text to numeric in E15394 / R15394C5: '2'
## Warning: Coercing text to numeric in E15395 / R15395C5: '2'
## Warning: Coercing text to numeric in E15396 / R15396C5: '2'
## Warning: Coercing text to numeric in E15397 / R15397C5: '2'
## Warning: Coercing text to numeric in E15398 / R15398C5: '2'
## Warning: Coercing text to numeric in E15399 / R15399C5: '2'
## Warning: Coercing text to numeric in E15400 / R15400C5: '2'
## Warning: Coercing text to numeric in E15401 / R15401C5: '2'
## Warning: Coercing text to numeric in E15402 / R15402C5: '2'
## Warning: Coercing text to numeric in E15403 / R15403C5: '2'
## Warning: Coercing text to numeric in E15404 / R15404C5: '1'
## Warning: Coercing text to numeric in E15405 / R15405C5: '1'
## Warning: Coercing text to numeric in E15406 / R15406C5: '1'
## Warning: Coercing text to numeric in E15407 / R15407C5: '1'
## Warning: Coercing text to numeric in E15408 / R15408C5: '1'
## Warning: Coercing text to numeric in E15409 / R15409C5: '1'
## Warning: Coercing text to numeric in E15410 / R15410C5: '1'
## Warning: Coercing text to numeric in E15411 / R15411C5: '1'
## Warning: Coercing text to numeric in E15412 / R15412C5: '1'
## Warning: Coercing text to numeric in E15413 / R15413C5: '1'
## Warning: Coercing text to numeric in E15414 / R15414C5: '1'
## Warning: Coercing text to numeric in E15415 / R15415C5: '1'
## Warning: Coercing text to numeric in E15416 / R15416C5: '2'
## Warning: Coercing text to numeric in E15417 / R15417C5: '2'
## Warning: Coercing text to numeric in E15418 / R15418C5: '2'
## Warning: Coercing text to numeric in E15419 / R15419C5: '2'
## Warning: Coercing text to numeric in E15420 / R15420C5: '2'
## Warning: Coercing text to numeric in E15421 / R15421C5: '2'
## Warning: Coercing text to numeric in E15422 / R15422C5: '1'
## Warning: Coercing text to numeric in E15423 / R15423C5: '1'
## Warning: Coercing text to numeric in E15424 / R15424C5: '1'
## Warning: Coercing text to numeric in E15425 / R15425C5: '1'
## Warning: Coercing text to numeric in E15426 / R15426C5: '1'
## Warning: Coercing text to numeric in E15427 / R15427C5: '1'
## Warning: Coercing text to numeric in E15428 / R15428C5: '2'
## Warning: Coercing text to numeric in E15429 / R15429C5: '2'
## Warning: Coercing text to numeric in E15430 / R15430C5: '2'
## Warning: Coercing text to numeric in E15431 / R15431C5: '2'
## Warning: Coercing text to numeric in E15432 / R15432C5: '2'
## Warning: Coercing text to numeric in E15433 / R15433C5: '2'
## Warning: Coercing text to numeric in E15434 / R15434C5: '1'
## Warning: Coercing text to numeric in E15435 / R15435C5: '1'
## Warning: Coercing text to numeric in E15436 / R15436C5: '1'
## Warning: Coercing text to numeric in E15437 / R15437C5: '1'
## Warning: Coercing text to numeric in E15438 / R15438C5: '1'
## Warning: Coercing text to numeric in E15439 / R15439C5: '1'
## Warning: Coercing text to numeric in E15440 / R15440C5: '2'
## Warning: Coercing text to numeric in E15441 / R15441C5: '2'
## Warning: Coercing text to numeric in E15442 / R15442C5: '2'
## Warning: Coercing text to numeric in E15443 / R15443C5: '2'
## Warning: Coercing text to numeric in E15444 / R15444C5: '2'
## Warning: Coercing text to numeric in E15445 / R15445C5: '2'
## Warning: Coercing text to numeric in E15446 / R15446C5: '2'
## Warning: Coercing text to numeric in E15447 / R15447C5: '2'
## Warning: Coercing text to numeric in E15448 / R15448C5: '2'
## Warning: Coercing text to numeric in E15449 / R15449C5: '2'
## Warning: Coercing text to numeric in E15450 / R15450C5: '2'
## Warning: Coercing text to numeric in E15451 / R15451C5: '2'
## Warning: Coercing text to numeric in E15452 / R15452C5: '2'
## Warning: Coercing text to numeric in E15453 / R15453C5: '2'
## Warning: Coercing text to numeric in E15454 / R15454C5: '2'
## Warning: Coercing text to numeric in E15455 / R15455C5: '2'
## Warning: Coercing text to numeric in E15456 / R15456C5: '2'
## Warning: Coercing text to numeric in E15457 / R15457C5: '2'
## Warning: Coercing text to numeric in E15458 / R15458C5: '1'
## Warning: Coercing text to numeric in E15459 / R15459C5: '1'
## Warning: Coercing text to numeric in E15460 / R15460C5: '1'
## Warning: Coercing text to numeric in E15461 / R15461C5: '1'
## Warning: Coercing text to numeric in E15462 / R15462C5: '1'
## Warning: Coercing text to numeric in E15463 / R15463C5: '1'
## Warning: Coercing text to numeric in E15464 / R15464C5: '2'
## Warning: Coercing text to numeric in E15465 / R15465C5: '2'
## Warning: Coercing text to numeric in E15466 / R15466C5: '2'
## Warning: Coercing text to numeric in E15467 / R15467C5: '2'
## Warning: Coercing text to numeric in E15468 / R15468C5: '2'
## Warning: Coercing text to numeric in E15469 / R15469C5: '2'
## Warning: Coercing text to numeric in E15470 / R15470C5: '2'
## Warning: Coercing text to numeric in E15471 / R15471C5: '2'
## Warning: Coercing text to numeric in E15472 / R15472C5: '2'
## Warning: Coercing text to numeric in E15473 / R15473C5: '2'
## Warning: Coercing text to numeric in E15474 / R15474C5: '2'
## Warning: Coercing text to numeric in E15475 / R15475C5: '2'
## Warning: Coercing text to numeric in E15476 / R15476C5: '2'
## Warning: Coercing text to numeric in E15477 / R15477C5: '2'
## Warning: Coercing text to numeric in E15478 / R15478C5: '2'
## Warning: Coercing text to numeric in E15479 / R15479C5: '2'
## Warning: Coercing text to numeric in E15480 / R15480C5: '2'
## Warning: Coercing text to numeric in E15481 / R15481C5: '2'
## Warning: Coercing text to numeric in E15482 / R15482C5: '2'
## Warning: Coercing text to numeric in E15483 / R15483C5: '2'
## Warning: Coercing text to numeric in E15484 / R15484C5: '2'
## Warning: Coercing text to numeric in E15485 / R15485C5: '2'
## Warning: Coercing text to numeric in E15486 / R15486C5: '2'
## Warning: Coercing text to numeric in E15487 / R15487C5: '2'
## Warning: Coercing text to numeric in E15488 / R15488C5: '2'
## Warning: Coercing text to numeric in E15489 / R15489C5: '2'
## Warning: Coercing text to numeric in E15490 / R15490C5: '2'
## Warning: Coercing text to numeric in E15491 / R15491C5: '2'
## Warning: Coercing text to numeric in E15492 / R15492C5: '2'
## Warning: Coercing text to numeric in E15493 / R15493C5: '2'
## Warning: Coercing text to numeric in E15494 / R15494C5: '2'
## Warning: Coercing text to numeric in E15495 / R15495C5: '2'
## Warning: Coercing text to numeric in E15496 / R15496C5: '2'
## Warning: Coercing text to numeric in E15497 / R15497C5: '2'
## Warning: Coercing text to numeric in E15498 / R15498C5: '2'
## Warning: Coercing text to numeric in E15499 / R15499C5: '2'
## Warning: Coercing text to numeric in E15500 / R15500C5: '1'
## Warning: Coercing text to numeric in E15501 / R15501C5: '1'
## Warning: Coercing text to numeric in E15502 / R15502C5: '1'
## Warning: Coercing text to numeric in E15503 / R15503C5: '1'
## Warning: Coercing text to numeric in E15504 / R15504C5: '1'
## Warning: Coercing text to numeric in E15505 / R15505C5: '1'
## Warning: Coercing text to numeric in E15506 / R15506C5: '1'
## Warning: Coercing text to numeric in E15507 / R15507C5: '1'
## Warning: Coercing text to numeric in E15508 / R15508C5: '1'
## Warning: Coercing text to numeric in E15509 / R15509C5: '1'
## Warning: Coercing text to numeric in E15510 / R15510C5: '1'
## Warning: Coercing text to numeric in E15511 / R15511C5: '1'
## Warning: Coercing text to numeric in E15512 / R15512C5: '2'
## Warning: Coercing text to numeric in E15513 / R15513C5: '2'
## Warning: Coercing text to numeric in E15514 / R15514C5: '2'
## Warning: Coercing text to numeric in E15515 / R15515C5: '2'
## Warning: Coercing text to numeric in E15516 / R15516C5: '2'
## Warning: Coercing text to numeric in E15517 / R15517C5: '2'
## Warning: Coercing text to numeric in E15518 / R15518C5: '1'
## Warning: Coercing text to numeric in E15519 / R15519C5: '1'
## Warning: Coercing text to numeric in E15520 / R15520C5: '1'
## Warning: Coercing text to numeric in E15521 / R15521C5: '1'
## Warning: Coercing text to numeric in E15522 / R15522C5: '1'
## Warning: Coercing text to numeric in E15523 / R15523C5: '1'
## Warning: Coercing text to numeric in E15524 / R15524C5: '2'
## Warning: Coercing text to numeric in E15525 / R15525C5: '2'
## Warning: Coercing text to numeric in E15526 / R15526C5: '2'
## Warning: Coercing text to numeric in E15527 / R15527C5: '2'
## Warning: Coercing text to numeric in E15528 / R15528C5: '2'
## Warning: Coercing text to numeric in E15529 / R15529C5: '2'
## Warning: Coercing text to numeric in E15530 / R15530C5: '2'
## Warning: Coercing text to numeric in E15531 / R15531C5: '2'
## Warning: Coercing text to numeric in E15532 / R15532C5: '2'
## Warning: Coercing text to numeric in E15533 / R15533C5: '2'
## Warning: Coercing text to numeric in E15534 / R15534C5: '2'
## Warning: Coercing text to numeric in E15535 / R15535C5: '2'
## Warning: Coercing text to numeric in E15536 / R15536C5: '1'
## Warning: Coercing text to numeric in E15537 / R15537C5: '1'
## Warning: Coercing text to numeric in E15538 / R15538C5: '1'
## Warning: Coercing text to numeric in E15539 / R15539C5: '1'
## Warning: Coercing text to numeric in E15540 / R15540C5: '1'
## Warning: Coercing text to numeric in E15541 / R15541C5: '1'
## Warning: Coercing text to numeric in E15542 / R15542C5: '1'
## Warning: Coercing text to numeric in E15543 / R15543C5: '1'
## Warning: Coercing text to numeric in E15544 / R15544C5: '1'
## Warning: Coercing text to numeric in E15545 / R15545C5: '1'
## Warning: Coercing text to numeric in E15546 / R15546C5: '1'
## Warning: Coercing text to numeric in E15547 / R15547C5: '1'
## Warning: Coercing text to numeric in E15548 / R15548C5: '1'
## Warning: Coercing text to numeric in E15549 / R15549C5: '1'
## Warning: Coercing text to numeric in E15550 / R15550C5: '1'
## Warning: Coercing text to numeric in E15551 / R15551C5: '1'
## Warning: Coercing text to numeric in E15552 / R15552C5: '1'
## Warning: Coercing text to numeric in E15553 / R15553C5: '1'
## Warning: Coercing text to numeric in E15554 / R15554C5: '2'
## Warning: Coercing text to numeric in E15555 / R15555C5: '2'
## Warning: Coercing text to numeric in E15556 / R15556C5: '2'
## Warning: Coercing text to numeric in E15557 / R15557C5: '2'
## Warning: Coercing text to numeric in E15558 / R15558C5: '2'
## Warning: Coercing text to numeric in E15559 / R15559C5: '2'
## Warning: Coercing text to numeric in E15560 / R15560C5: '2'
## Warning: Coercing text to numeric in E15561 / R15561C5: '2'
## Warning: Coercing text to numeric in E15562 / R15562C5: '2'
## Warning: Coercing text to numeric in E15563 / R15563C5: '2'
## Warning: Coercing text to numeric in E15564 / R15564C5: '2'
## Warning: Coercing text to numeric in E15565 / R15565C5: '2'
## Warning: Coercing text to numeric in E15566 / R15566C5: '1'
## Warning: Coercing text to numeric in E15567 / R15567C5: '1'
## Warning: Coercing text to numeric in E15568 / R15568C5: '1'
## Warning: Coercing text to numeric in E15569 / R15569C5: '1'
## Warning: Coercing text to numeric in E15570 / R15570C5: '1'
## Warning: Coercing text to numeric in E15571 / R15571C5: '1'
## Warning: Coercing text to numeric in E15572 / R15572C5: '2'
## Warning: Coercing text to numeric in E15573 / R15573C5: '2'
## Warning: Coercing text to numeric in E15574 / R15574C5: '2'
## Warning: Coercing text to numeric in E15575 / R15575C5: '2'
## Warning: Coercing text to numeric in E15576 / R15576C5: '2'
## Warning: Coercing text to numeric in E15577 / R15577C5: '2'
## Warning: Coercing text to numeric in E15578 / R15578C5: '2'
## Warning: Coercing text to numeric in E15579 / R15579C5: '2'
## Warning: Coercing text to numeric in E15580 / R15580C5: '2'
## Warning: Coercing text to numeric in E15581 / R15581C5: '2'
## Warning: Coercing text to numeric in E15582 / R15582C5: '2'
## Warning: Coercing text to numeric in E15583 / R15583C5: '2'
## Warning: Coercing text to numeric in E15584 / R15584C5: '2'
## Warning: Coercing text to numeric in E15585 / R15585C5: '2'
## Warning: Coercing text to numeric in E15586 / R15586C5: '2'
## Warning: Coercing text to numeric in E15587 / R15587C5: '2'
## Warning: Coercing text to numeric in E15588 / R15588C5: '2'
## Warning: Coercing text to numeric in E15589 / R15589C5: '2'
## Warning: Coercing text to numeric in E15590 / R15590C5: '1'
## Warning: Coercing text to numeric in E15591 / R15591C5: '1'
## Warning: Coercing text to numeric in E15592 / R15592C5: '1'
## Warning: Coercing text to numeric in E15593 / R15593C5: '1'
## Warning: Coercing text to numeric in E15594 / R15594C5: '1'
## Warning: Coercing text to numeric in E15595 / R15595C5: '1'
## Warning: Coercing text to numeric in E15596 / R15596C5: '2'
## Warning: Coercing text to numeric in E15597 / R15597C5: '2'
## Warning: Coercing text to numeric in E15598 / R15598C5: '2'
## Warning: Coercing text to numeric in E15599 / R15599C5: '2'
## Warning: Coercing text to numeric in E15600 / R15600C5: '2'
## Warning: Coercing text to numeric in E15601 / R15601C5: '2'
## Warning: Coercing text to numeric in E15602 / R15602C5: '1'
## Warning: Coercing text to numeric in E15603 / R15603C5: '1'
## Warning: Coercing text to numeric in E15604 / R15604C5: '1'
## Warning: Coercing text to numeric in E15605 / R15605C5: '1'
## Warning: Coercing text to numeric in E15606 / R15606C5: '1'
## Warning: Coercing text to numeric in E15607 / R15607C5: '1'
## Warning: Coercing text to numeric in E15608 / R15608C5: '1'
## Warning: Coercing text to numeric in E15609 / R15609C5: '1'
## Warning: Coercing text to numeric in E15610 / R15610C5: '1'
## Warning: Coercing text to numeric in E15611 / R15611C5: '1'
## Warning: Coercing text to numeric in E15612 / R15612C5: '1'
## Warning: Coercing text to numeric in E15613 / R15613C5: '1'
## Warning: Coercing text to numeric in E15614 / R15614C5: '1'
## Warning: Coercing text to numeric in E15615 / R15615C5: '1'
## Warning: Coercing text to numeric in E15616 / R15616C5: '1'
## Warning: Coercing text to numeric in E15617 / R15617C5: '1'
## Warning: Coercing text to numeric in E15618 / R15618C5: '1'
## Warning: Coercing text to numeric in E15619 / R15619C5: '1'
## Warning: Coercing text to numeric in E15620 / R15620C5: '1'
## Warning: Coercing text to numeric in E15621 / R15621C5: '1'
## Warning: Coercing text to numeric in E15622 / R15622C5: '1'
## Warning: Coercing text to numeric in E15623 / R15623C5: '1'
## Warning: Coercing text to numeric in E15624 / R15624C5: '1'
## Warning: Coercing text to numeric in E15625 / R15625C5: '1'
## Warning: Coercing text to numeric in E15626 / R15626C5: '2'
## Warning: Coercing text to numeric in E15627 / R15627C5: '2'
## Warning: Coercing text to numeric in E15628 / R15628C5: '2'
## Warning: Coercing text to numeric in E15629 / R15629C5: '2'
## Warning: Coercing text to numeric in E15630 / R15630C5: '2'
## Warning: Coercing text to numeric in E15631 / R15631C5: '2'
## Warning: Coercing text to numeric in E15632 / R15632C5: '1'
## Warning: Coercing text to numeric in E15633 / R15633C5: '1'
## Warning: Coercing text to numeric in E15634 / R15634C5: '1'
## Warning: Coercing text to numeric in E15635 / R15635C5: '1'
## Warning: Coercing text to numeric in E15636 / R15636C5: '1'
## Warning: Coercing text to numeric in E15637 / R15637C5: '1'
## Warning: Coercing text to numeric in E15638 / R15638C5: '2'
## Warning: Coercing text to numeric in E15639 / R15639C5: '2'
## Warning: Coercing text to numeric in E15640 / R15640C5: '2'
## Warning: Coercing text to numeric in E15641 / R15641C5: '2'
## Warning: Coercing text to numeric in E15642 / R15642C5: '2'
## Warning: Coercing text to numeric in E15643 / R15643C5: '2'
## Warning: Coercing text to numeric in E15644 / R15644C5: '2'
## Warning: Coercing text to numeric in E15645 / R15645C5: '2'
## Warning: Coercing text to numeric in E15646 / R15646C5: '2'
## Warning: Coercing text to numeric in E15647 / R15647C5: '2'
## Warning: Coercing text to numeric in E15648 / R15648C5: '2'
## Warning: Coercing text to numeric in E15649 / R15649C5: '2'
## Warning: Coercing text to numeric in E15650 / R15650C5: '2'
## Warning: Coercing text to numeric in E15651 / R15651C5: '2'
## Warning: Coercing text to numeric in E15652 / R15652C5: '2'
## Warning: Coercing text to numeric in E15653 / R15653C5: '2'
## Warning: Coercing text to numeric in E15654 / R15654C5: '2'
## Warning: Coercing text to numeric in E15655 / R15655C5: '2'
## Warning: Coercing text to numeric in E15656 / R15656C5: '2'
## Warning: Coercing text to numeric in E15657 / R15657C5: '2'
## Warning: Coercing text to numeric in E15658 / R15658C5: '2'
## Warning: Coercing text to numeric in E15659 / R15659C5: '2'
## Warning: Coercing text to numeric in E15660 / R15660C5: '2'
## Warning: Coercing text to numeric in E15661 / R15661C5: '2'
## Warning: Coercing text to numeric in E15662 / R15662C5: '2'
## Warning: Coercing text to numeric in E15663 / R15663C5: '2'
## Warning: Coercing text to numeric in E15664 / R15664C5: '2'
## Warning: Coercing text to numeric in E15665 / R15665C5: '2'
## Warning: Coercing text to numeric in E15666 / R15666C5: '2'
## Warning: Coercing text to numeric in E15667 / R15667C5: '2'
## Warning: Coercing text to numeric in E15668 / R15668C5: '1'
## Warning: Coercing text to numeric in E15669 / R15669C5: '1'
## Warning: Coercing text to numeric in E15670 / R15670C5: '1'
## Warning: Coercing text to numeric in E15671 / R15671C5: '1'
## Warning: Coercing text to numeric in E15672 / R15672C5: '1'
## Warning: Coercing text to numeric in E15673 / R15673C5: '1'
## Warning: Coercing text to numeric in E15674 / R15674C5: '1'
## Warning: Coercing text to numeric in E15675 / R15675C5: '1'
## Warning: Coercing text to numeric in E15676 / R15676C5: '1'
## Warning: Coercing text to numeric in E15677 / R15677C5: '1'
## Warning: Coercing text to numeric in E15678 / R15678C5: '1'
## Warning: Coercing text to numeric in E15679 / R15679C5: '1'
## Warning: Coercing text to numeric in E15680 / R15680C5: '1'
## Warning: Coercing text to numeric in E15681 / R15681C5: '1'
## Warning: Coercing text to numeric in E15682 / R15682C5: '1'
## Warning: Coercing text to numeric in E15683 / R15683C5: '1'
## Warning: Coercing text to numeric in E15684 / R15684C5: '1'
## Warning: Coercing text to numeric in E15685 / R15685C5: '1'
## Warning: Coercing text to numeric in E15686 / R15686C5: '1'
## Warning: Coercing text to numeric in E15687 / R15687C5: '1'
## Warning: Coercing text to numeric in E15688 / R15688C5: '1'
## Warning: Coercing text to numeric in E15689 / R15689C5: '1'
## Warning: Coercing text to numeric in E15690 / R15690C5: '1'
## Warning: Coercing text to numeric in E15691 / R15691C5: '1'
## Warning: Coercing text to numeric in E15692 / R15692C5: '2'
## Warning: Coercing text to numeric in E15693 / R15693C5: '2'
## Warning: Coercing text to numeric in E15694 / R15694C5: '2'
## Warning: Coercing text to numeric in E15695 / R15695C5: '2'
## Warning: Coercing text to numeric in E15696 / R15696C5: '2'
## Warning: Coercing text to numeric in E15697 / R15697C5: '2'
## Warning: Coercing text to numeric in E15698 / R15698C5: '2'
## Warning: Coercing text to numeric in E15699 / R15699C5: '2'
## Warning: Coercing text to numeric in E15700 / R15700C5: '2'
## Warning: Coercing text to numeric in E15701 / R15701C5: '2'
## Warning: Coercing text to numeric in E15702 / R15702C5: '2'
## Warning: Coercing text to numeric in E15703 / R15703C5: '2'
## Warning: Coercing text to numeric in E15704 / R15704C5: '2'
## Warning: Coercing text to numeric in E15705 / R15705C5: '2'
## Warning: Coercing text to numeric in E15706 / R15706C5: '2'
## Warning: Coercing text to numeric in E15707 / R15707C5: '2'
## Warning: Coercing text to numeric in E15708 / R15708C5: '2'
## Warning: Coercing text to numeric in E15709 / R15709C5: '2'
## Warning: Coercing text to numeric in E15710 / R15710C5: '1'
## Warning: Coercing text to numeric in E15711 / R15711C5: '1'
## Warning: Coercing text to numeric in E15712 / R15712C5: '1'
## Warning: Coercing text to numeric in E15713 / R15713C5: '1'
## Warning: Coercing text to numeric in E15714 / R15714C5: '1'
## Warning: Coercing text to numeric in E15715 / R15715C5: '1'
## Warning: Coercing text to numeric in E15716 / R15716C5: '1'
## Warning: Coercing text to numeric in E15717 / R15717C5: '1'
## Warning: Coercing text to numeric in E15718 / R15718C5: '1'
## Warning: Coercing text to numeric in E15719 / R15719C5: '1'
## Warning: Coercing text to numeric in E15720 / R15720C5: '1'
## Warning: Coercing text to numeric in E15721 / R15721C5: '1'
## Warning: Coercing text to numeric in E15722 / R15722C5: '1'
## Warning: Coercing text to numeric in E15723 / R15723C5: '1'
## Warning: Coercing text to numeric in E15724 / R15724C5: '1'
## Warning: Coercing text to numeric in E15725 / R15725C5: '1'
## Warning: Coercing text to numeric in E15726 / R15726C5: '1'
## Warning: Coercing text to numeric in E15727 / R15727C5: '1'
## Warning: Coercing text to numeric in E15728 / R15728C5: '2'
## Warning: Coercing text to numeric in E15729 / R15729C5: '2'
## Warning: Coercing text to numeric in E15730 / R15730C5: '2'
## Warning: Coercing text to numeric in E15731 / R15731C5: '2'
## Warning: Coercing text to numeric in E15732 / R15732C5: '2'
## Warning: Coercing text to numeric in E15733 / R15733C5: '2'
## Warning: Coercing text to numeric in E15734 / R15734C5: '1'
## Warning: Coercing text to numeric in E15735 / R15735C5: '1'
## Warning: Coercing text to numeric in E15736 / R15736C5: '1'
## Warning: Coercing text to numeric in E15737 / R15737C5: '1'
## Warning: Coercing text to numeric in E15738 / R15738C5: '1'
## Warning: Coercing text to numeric in E15739 / R15739C5: '1'
## Warning: Coercing text to numeric in E15740 / R15740C5: '1'
## Warning: Coercing text to numeric in E15741 / R15741C5: '1'
## Warning: Coercing text to numeric in E15742 / R15742C5: '1'
## Warning: Coercing text to numeric in E15743 / R15743C5: '1'
## Warning: Coercing text to numeric in E15744 / R15744C5: '1'
## Warning: Coercing text to numeric in E15745 / R15745C5: '1'
## Warning: Coercing text to numeric in E15746 / R15746C5: '2'
## Warning: Coercing text to numeric in E15747 / R15747C5: '2'
## Warning: Coercing text to numeric in E15748 / R15748C5: '2'
## Warning: Coercing text to numeric in E15749 / R15749C5: '2'
## Warning: Coercing text to numeric in E15750 / R15750C5: '2'
## Warning: Coercing text to numeric in E15751 / R15751C5: '2'
## Warning: Coercing text to numeric in E15752 / R15752C5: '2'
## Warning: Coercing text to numeric in E15753 / R15753C5: '2'
## Warning: Coercing text to numeric in E15754 / R15754C5: '2'
## Warning: Coercing text to numeric in E15755 / R15755C5: '2'
## Warning: Coercing text to numeric in E15756 / R15756C5: '2'
## Warning: Coercing text to numeric in E15757 / R15757C5: '2'
## Warning: Coercing text to numeric in E15758 / R15758C5: '2'
## Warning: Coercing text to numeric in E15759 / R15759C5: '2'
## Warning: Coercing text to numeric in E15760 / R15760C5: '2'
## Warning: Coercing text to numeric in E15761 / R15761C5: '2'
## Warning: Coercing text to numeric in E15762 / R15762C5: '2'
## Warning: Coercing text to numeric in E15763 / R15763C5: '2'
## Warning: Coercing text to numeric in E15764 / R15764C5: '2'
## Warning: Coercing text to numeric in E15765 / R15765C5: '2'
## Warning: Coercing text to numeric in E15766 / R15766C5: '2'
## Warning: Coercing text to numeric in E15767 / R15767C5: '2'
## Warning: Coercing text to numeric in E15768 / R15768C5: '2'
## Warning: Coercing text to numeric in E15769 / R15769C5: '2'
## Warning: Coercing text to numeric in E15770 / R15770C5: '2'
## Warning: Coercing text to numeric in E15771 / R15771C5: '2'
## Warning: Coercing text to numeric in E15772 / R15772C5: '2'
## Warning: Coercing text to numeric in E15773 / R15773C5: '2'
## Warning: Coercing text to numeric in E15774 / R15774C5: '2'
## Warning: Coercing text to numeric in E15775 / R15775C5: '2'
## Warning: Coercing text to numeric in E15776 / R15776C5: '2'
## Warning: Coercing text to numeric in E15777 / R15777C5: '2'
## Warning: Coercing text to numeric in E15778 / R15778C5: '2'
## Warning: Coercing text to numeric in E15779 / R15779C5: '2'
## Warning: Coercing text to numeric in E15780 / R15780C5: '2'
## Warning: Coercing text to numeric in E15781 / R15781C5: '2'
## Warning: Coercing text to numeric in E15782 / R15782C5: '2'
## Warning: Coercing text to numeric in E15783 / R15783C5: '2'
## Warning: Coercing text to numeric in E15784 / R15784C5: '2'
## Warning: Coercing text to numeric in E15785 / R15785C5: '2'
## Warning: Coercing text to numeric in E15786 / R15786C5: '2'
## Warning: Coercing text to numeric in E15787 / R15787C5: '2'
## Warning: Coercing text to numeric in E15788 / R15788C5: '1'
## Warning: Coercing text to numeric in E15789 / R15789C5: '1'
## Warning: Coercing text to numeric in E15790 / R15790C5: '1'
## Warning: Coercing text to numeric in E15791 / R15791C5: '1'
## Warning: Coercing text to numeric in E15792 / R15792C5: '1'
## Warning: Coercing text to numeric in E15793 / R15793C5: '1'
## Warning: Coercing text to numeric in E15794 / R15794C5: '1'
## Warning: Coercing text to numeric in E15795 / R15795C5: '1'
## Warning: Coercing text to numeric in E15796 / R15796C5: '1'
## Warning: Coercing text to numeric in E15797 / R15797C5: '1'
## Warning: Coercing text to numeric in E15798 / R15798C5: '1'
## Warning: Coercing text to numeric in E15799 / R15799C5: '1'
## Warning: Coercing text to numeric in E15800 / R15800C5: '1'
## Warning: Coercing text to numeric in E15801 / R15801C5: '1'
## Warning: Coercing text to numeric in E15802 / R15802C5: '1'
## Warning: Coercing text to numeric in E15803 / R15803C5: '1'
## Warning: Coercing text to numeric in E15804 / R15804C5: '1'
## Warning: Coercing text to numeric in E15805 / R15805C5: '1'
## Warning: Coercing text to numeric in E15806 / R15806C5: '2'
## Warning: Coercing text to numeric in E15807 / R15807C5: '2'
## Warning: Coercing text to numeric in E15808 / R15808C5: '2'
## Warning: Coercing text to numeric in E15809 / R15809C5: '2'
## Warning: Coercing text to numeric in E15810 / R15810C5: '2'
## Warning: Coercing text to numeric in E15811 / R15811C5: '2'
## Warning: Coercing text to numeric in E15812 / R15812C5: '2'
## Warning: Coercing text to numeric in E15813 / R15813C5: '2'
## Warning: Coercing text to numeric in E15814 / R15814C5: '2'
## Warning: Coercing text to numeric in E15815 / R15815C5: '2'
## Warning: Coercing text to numeric in E15816 / R15816C5: '2'
## Warning: Coercing text to numeric in E15817 / R15817C5: '2'
## Warning: Coercing text to numeric in E15818 / R15818C5: '2'
## Warning: Coercing text to numeric in E15819 / R15819C5: '2'
## Warning: Coercing text to numeric in E15820 / R15820C5: '2'
## Warning: Coercing text to numeric in E15821 / R15821C5: '2'
## Warning: Coercing text to numeric in E15822 / R15822C5: '2'
## Warning: Coercing text to numeric in E15823 / R15823C5: '2'
## Warning: Coercing text to numeric in E15824 / R15824C5: '1'
## Warning: Coercing text to numeric in E15825 / R15825C5: '1'
## Warning: Coercing text to numeric in E15826 / R15826C5: '1'
## Warning: Coercing text to numeric in E15827 / R15827C5: '1'
## Warning: Coercing text to numeric in E15828 / R15828C5: '1'
## Warning: Coercing text to numeric in E15829 / R15829C5: '1'
## Warning: Coercing text to numeric in E15830 / R15830C5: '2'
## Warning: Coercing text to numeric in E15831 / R15831C5: '2'
## Warning: Coercing text to numeric in E15832 / R15832C5: '2'
## Warning: Coercing text to numeric in E15833 / R15833C5: '2'
## Warning: Coercing text to numeric in E15834 / R15834C5: '2'
## Warning: Coercing text to numeric in E15835 / R15835C5: '2'
## Warning: Coercing text to numeric in E15836 / R15836C5: '2'
## Warning: Coercing text to numeric in E15837 / R15837C5: '2'
## Warning: Coercing text to numeric in E15838 / R15838C5: '2'
## Warning: Coercing text to numeric in E15839 / R15839C5: '2'
## Warning: Coercing text to numeric in E15840 / R15840C5: '2'
## Warning: Coercing text to numeric in E15841 / R15841C5: '2'
## Warning: Coercing text to numeric in E15842 / R15842C5: '2'
## Warning: Coercing text to numeric in E15843 / R15843C5: '2'
## Warning: Coercing text to numeric in E15844 / R15844C5: '2'
## Warning: Coercing text to numeric in E15845 / R15845C5: '2'
## Warning: Coercing text to numeric in E15846 / R15846C5: '2'
## Warning: Coercing text to numeric in E15847 / R15847C5: '2'
## Warning: Coercing text to numeric in E15848 / R15848C5: '2'
## Warning: Coercing text to numeric in E15849 / R15849C5: '2'
## Warning: Coercing text to numeric in E15850 / R15850C5: '2'
## Warning: Coercing text to numeric in E15851 / R15851C5: '2'
## Warning: Coercing text to numeric in E15852 / R15852C5: '2'
## Warning: Coercing text to numeric in E15853 / R15853C5: '2'
## Warning: Coercing text to numeric in E15854 / R15854C5: '2'
## Warning: Coercing text to numeric in E15855 / R15855C5: '2'
## Warning: Coercing text to numeric in E15856 / R15856C5: '2'
## Warning: Coercing text to numeric in E15857 / R15857C5: '2'
## Warning: Coercing text to numeric in E15858 / R15858C5: '2'
## Warning: Coercing text to numeric in E15859 / R15859C5: '2'
## Warning: Coercing text to numeric in E15860 / R15860C5: '2'
## Warning: Coercing text to numeric in E15861 / R15861C5: '2'
## Warning: Coercing text to numeric in E15862 / R15862C5: '2'
## Warning: Coercing text to numeric in E15863 / R15863C5: '2'
## Warning: Coercing text to numeric in E15864 / R15864C5: '2'
## Warning: Coercing text to numeric in E15865 / R15865C5: '2'
## Warning: Coercing text to numeric in E15866 / R15866C5: '2'
## Warning: Coercing text to numeric in E15867 / R15867C5: '2'
## Warning: Coercing text to numeric in E15868 / R15868C5: '2'
## Warning: Coercing text to numeric in E15869 / R15869C5: '2'
## Warning: Coercing text to numeric in E15870 / R15870C5: '2'
## Warning: Coercing text to numeric in E15871 / R15871C5: '2'
## Warning: Coercing text to numeric in E15872 / R15872C5: '1'
## Warning: Coercing text to numeric in E15873 / R15873C5: '1'
## Warning: Coercing text to numeric in E15874 / R15874C5: '1'
## Warning: Coercing text to numeric in E15875 / R15875C5: '1'
## Warning: Coercing text to numeric in E15876 / R15876C5: '1'
## Warning: Coercing text to numeric in E15877 / R15877C5: '1'
## Warning: Coercing text to numeric in E15878 / R15878C5: '1'
## Warning: Coercing text to numeric in E15879 / R15879C5: '1'
## Warning: Coercing text to numeric in E15880 / R15880C5: '1'
## Warning: Coercing text to numeric in E15881 / R15881C5: '1'
## Warning: Coercing text to numeric in E15882 / R15882C5: '1'
## Warning: Coercing text to numeric in E15883 / R15883C5: '1'
## Warning: Coercing text to numeric in E15884 / R15884C5: '1'
## Warning: Coercing text to numeric in E15885 / R15885C5: '1'
## Warning: Coercing text to numeric in E15886 / R15886C5: '1'
## Warning: Coercing text to numeric in E15887 / R15887C5: '1'
## Warning: Coercing text to numeric in E15888 / R15888C5: '1'
## Warning: Coercing text to numeric in E15889 / R15889C5: '1'
## Warning: Coercing text to numeric in E15890 / R15890C5: '1'
## Warning: Coercing text to numeric in E15891 / R15891C5: '1'
## Warning: Coercing text to numeric in E15892 / R15892C5: '1'
## Warning: Coercing text to numeric in E15893 / R15893C5: '1'
## Warning: Coercing text to numeric in E15894 / R15894C5: '1'
## Warning: Coercing text to numeric in E15895 / R15895C5: '1'
## Warning: Coercing text to numeric in E15896 / R15896C5: '1'
## Warning: Coercing text to numeric in E15897 / R15897C5: '1'
## Warning: Coercing text to numeric in E15898 / R15898C5: '1'
## Warning: Coercing text to numeric in E15899 / R15899C5: '1'
## Warning: Coercing text to numeric in E15900 / R15900C5: '1'
## Warning: Coercing text to numeric in E15901 / R15901C5: '1'
## Warning: Coercing text to numeric in E15902 / R15902C5: '2'
## Warning: Coercing text to numeric in E15903 / R15903C5: '2'
## Warning: Coercing text to numeric in E15904 / R15904C5: '2'
## Warning: Coercing text to numeric in E15905 / R15905C5: '2'
## Warning: Coercing text to numeric in E15906 / R15906C5: '2'
## Warning: Coercing text to numeric in E15907 / R15907C5: '2'
## Warning: Coercing text to numeric in E15908 / R15908C5: '2'
## Warning: Coercing text to numeric in E15909 / R15909C5: '2'
## Warning: Coercing text to numeric in E15910 / R15910C5: '2'
## Warning: Coercing text to numeric in E15911 / R15911C5: '2'
## Warning: Coercing text to numeric in E15912 / R15912C5: '2'
## Warning: Coercing text to numeric in E15913 / R15913C5: '2'
## Warning: Coercing text to numeric in E15914 / R15914C5: '2'
## Warning: Coercing text to numeric in E15915 / R15915C5: '2'
## Warning: Coercing text to numeric in E15916 / R15916C5: '2'
## Warning: Coercing text to numeric in E15917 / R15917C5: '2'
## Warning: Coercing text to numeric in E15918 / R15918C5: '2'
## Warning: Coercing text to numeric in E15919 / R15919C5: '2'
## Warning: Coercing text to numeric in E15920 / R15920C5: '1'
## Warning: Coercing text to numeric in E15921 / R15921C5: '1'
## Warning: Coercing text to numeric in E15922 / R15922C5: '1'
## Warning: Coercing text to numeric in E15923 / R15923C5: '1'
## Warning: Coercing text to numeric in E15924 / R15924C5: '1'
## Warning: Coercing text to numeric in E15925 / R15925C5: '1'
## Warning: Coercing text to numeric in E15926 / R15926C5: '1'
## Warning: Coercing text to numeric in E15927 / R15927C5: '1'
## Warning: Coercing text to numeric in E15928 / R15928C5: '1'
## Warning: Coercing text to numeric in E15929 / R15929C5: '1'
## Warning: Coercing text to numeric in E15930 / R15930C5: '1'
## Warning: Coercing text to numeric in E15931 / R15931C5: '1'
## Warning: Coercing text to numeric in E15932 / R15932C5: '1'
## Warning: Coercing text to numeric in E15933 / R15933C5: '1'
## Warning: Coercing text to numeric in E15934 / R15934C5: '1'
## Warning: Coercing text to numeric in E15935 / R15935C5: '1'
## Warning: Coercing text to numeric in E15936 / R15936C5: '1'
## Warning: Coercing text to numeric in E15937 / R15937C5: '1'
## Warning: Coercing text to numeric in E15938 / R15938C5: '1'
## Warning: Coercing text to numeric in E15939 / R15939C5: '1'
## Warning: Coercing text to numeric in E15940 / R15940C5: '1'
## Warning: Coercing text to numeric in E15941 / R15941C5: '1'
## Warning: Coercing text to numeric in E15942 / R15942C5: '1'
## Warning: Coercing text to numeric in E15943 / R15943C5: '1'
## Warning: Coercing text to numeric in E15944 / R15944C5: '1'
## Warning: Coercing text to numeric in E15945 / R15945C5: '1'
## Warning: Coercing text to numeric in E15946 / R15946C5: '1'
## Warning: Coercing text to numeric in E15947 / R15947C5: '1'
## Warning: Coercing text to numeric in E15948 / R15948C5: '1'
## Warning: Coercing text to numeric in E15949 / R15949C5: '1'
## Warning: Coercing text to numeric in E15950 / R15950C5: '1'
## Warning: Coercing text to numeric in E15951 / R15951C5: '1'
## Warning: Coercing text to numeric in E15952 / R15952C5: '1'
## Warning: Coercing text to numeric in E15953 / R15953C5: '1'
## Warning: Coercing text to numeric in E15954 / R15954C5: '1'
## Warning: Coercing text to numeric in E15955 / R15955C5: '1'
## Warning: Coercing text to numeric in E15956 / R15956C5: '1'
## Warning: Coercing text to numeric in E15957 / R15957C5: '1'
## Warning: Coercing text to numeric in E15958 / R15958C5: '1'
## Warning: Coercing text to numeric in E15959 / R15959C5: '1'
## Warning: Coercing text to numeric in E15960 / R15960C5: '1'
## Warning: Coercing text to numeric in E15961 / R15961C5: '1'
## Warning: Coercing text to numeric in E15962 / R15962C5: '1'
## Warning: Coercing text to numeric in E15963 / R15963C5: '1'
## Warning: Coercing text to numeric in E15964 / R15964C5: '1'
## Warning: Coercing text to numeric in E15965 / R15965C5: '1'
## Warning: Coercing text to numeric in E15966 / R15966C5: '1'
## Warning: Coercing text to numeric in E15967 / R15967C5: '1'
## Warning: Coercing text to numeric in E15968 / R15968C5: '1'
## Warning: Coercing text to numeric in E15969 / R15969C5: '1'
## Warning: Coercing text to numeric in E15970 / R15970C5: '1'
## Warning: Coercing text to numeric in E15971 / R15971C5: '1'
## Warning: Coercing text to numeric in E15972 / R15972C5: '1'
## Warning: Coercing text to numeric in E15973 / R15973C5: '1'
## Warning: Coercing text to numeric in E15974 / R15974C5: '2'
## Warning: Coercing text to numeric in E15975 / R15975C5: '2'
## Warning: Coercing text to numeric in E15976 / R15976C5: '2'
## Warning: Coercing text to numeric in E15977 / R15977C5: '2'
## Warning: Coercing text to numeric in E15978 / R15978C5: '2'
## Warning: Coercing text to numeric in E15979 / R15979C5: '2'
## Warning: Coercing text to numeric in E15980 / R15980C5: '2'
## Warning: Coercing text to numeric in E15981 / R15981C5: '2'
## Warning: Coercing text to numeric in E15982 / R15982C5: '2'
## Warning: Coercing text to numeric in E15983 / R15983C5: '2'
## Warning: Coercing text to numeric in E15984 / R15984C5: '2'
## Warning: Coercing text to numeric in E15985 / R15985C5: '2'
## Warning: Coercing text to numeric in E15986 / R15986C5: '2'
## Warning: Coercing text to numeric in E15987 / R15987C5: '2'
## Warning: Coercing text to numeric in E15988 / R15988C5: '2'
## Warning: Coercing text to numeric in E15989 / R15989C5: '2'
## Warning: Coercing text to numeric in E15990 / R15990C5: '2'
## Warning: Coercing text to numeric in E15991 / R15991C5: '2'
## Warning: Coercing text to numeric in E15992 / R15992C5: '2'
## Warning: Coercing text to numeric in E15993 / R15993C5: '2'
## Warning: Coercing text to numeric in E15994 / R15994C5: '2'
## Warning: Coercing text to numeric in E15995 / R15995C5: '2'
## Warning: Coercing text to numeric in E15996 / R15996C5: '2'
## Warning: Coercing text to numeric in E15997 / R15997C5: '2'
## Warning: Coercing text to numeric in E15998 / R15998C5: '2'
## Warning: Coercing text to numeric in E15999 / R15999C5: '2'
## Warning: Coercing text to numeric in E16000 / R16000C5: '2'
## Warning: Coercing text to numeric in E16001 / R16001C5: '2'
## Warning: Coercing text to numeric in E16002 / R16002C5: '2'
## Warning: Coercing text to numeric in E16003 / R16003C5: '2'
## Warning: Coercing text to numeric in E16004 / R16004C5: '1'
## Warning: Coercing text to numeric in E16005 / R16005C5: '1'
## Warning: Coercing text to numeric in E16006 / R16006C5: '1'
## Warning: Coercing text to numeric in E16007 / R16007C5: '1'
## Warning: Coercing text to numeric in E16008 / R16008C5: '1'
## Warning: Coercing text to numeric in E16009 / R16009C5: '1'
## Warning: Coercing text to numeric in E16010 / R16010C5: '1'
## Warning: Coercing text to numeric in E16011 / R16011C5: '1'
## Warning: Coercing text to numeric in E16012 / R16012C5: '1'
## Warning: Coercing text to numeric in E16013 / R16013C5: '1'
## Warning: Coercing text to numeric in E16014 / R16014C5: '1'
## Warning: Coercing text to numeric in E16015 / R16015C5: '1'
## Warning: Coercing text to numeric in E16016 / R16016C5: '2'
## Warning: Coercing text to numeric in E16017 / R16017C5: '2'
## Warning: Coercing text to numeric in E16018 / R16018C5: '2'
## Warning: Coercing text to numeric in E16019 / R16019C5: '2'
## Warning: Coercing text to numeric in E16020 / R16020C5: '2'
## Warning: Coercing text to numeric in E16021 / R16021C5: '2'
## Warning: Coercing text to numeric in E16022 / R16022C5: '1'
## Warning: Coercing text to numeric in E16023 / R16023C5: '1'
## Warning: Coercing text to numeric in E16024 / R16024C5: '1'
## Warning: Coercing text to numeric in E16025 / R16025C5: '1'
## Warning: Coercing text to numeric in E16026 / R16026C5: '1'
## Warning: Coercing text to numeric in E16027 / R16027C5: '1'
## Warning: Coercing text to numeric in E16028 / R16028C5: '1'
## Warning: Coercing text to numeric in E16029 / R16029C5: '1'
## Warning: Coercing text to numeric in E16030 / R16030C5: '1'
## Warning: Coercing text to numeric in E16031 / R16031C5: '1'
## Warning: Coercing text to numeric in E16032 / R16032C5: '1'
## Warning: Coercing text to numeric in E16033 / R16033C5: '1'
## Warning: Coercing text to numeric in E16034 / R16034C5: '1'
## Warning: Coercing text to numeric in E16035 / R16035C5: '1'
## Warning: Coercing text to numeric in E16036 / R16036C5: '1'
## Warning: Coercing text to numeric in E16037 / R16037C5: '1'
## Warning: Coercing text to numeric in E16038 / R16038C5: '1'
## Warning: Coercing text to numeric in E16039 / R16039C5: '1'
## Warning: Coercing text to numeric in E16040 / R16040C5: '1'
## Warning: Coercing text to numeric in E16041 / R16041C5: '1'
## Warning: Coercing text to numeric in E16042 / R16042C5: '1'
## Warning: Coercing text to numeric in E16043 / R16043C5: '1'
## Warning: Coercing text to numeric in E16044 / R16044C5: '1'
## Warning: Coercing text to numeric in E16045 / R16045C5: '1'
## Warning: Coercing text to numeric in E16046 / R16046C5: '2'
## Warning: Coercing text to numeric in E16047 / R16047C5: '2'
## Warning: Coercing text to numeric in E16048 / R16048C5: '2'
## Warning: Coercing text to numeric in E16049 / R16049C5: '2'
## Warning: Coercing text to numeric in E16050 / R16050C5: '2'
## Warning: Coercing text to numeric in E16051 / R16051C5: '2'
## Warning: Coercing text to numeric in E16052 / R16052C5: '1'
## Warning: Coercing text to numeric in E16053 / R16053C5: '1'
## Warning: Coercing text to numeric in E16054 / R16054C5: '1'
## Warning: Coercing text to numeric in E16055 / R16055C5: '1'
## Warning: Coercing text to numeric in E16056 / R16056C5: '1'
## Warning: Coercing text to numeric in E16057 / R16057C5: '1'
## Warning: Coercing text to numeric in E16058 / R16058C5: '2'
## Warning: Coercing text to numeric in E16059 / R16059C5: '2'
## Warning: Coercing text to numeric in E16060 / R16060C5: '2'
## Warning: Coercing text to numeric in E16061 / R16061C5: '2'
## Warning: Coercing text to numeric in E16062 / R16062C5: '2'
## Warning: Coercing text to numeric in E16063 / R16063C5: '2'
## Warning: Coercing text to numeric in E16064 / R16064C5: '1'
## Warning: Coercing text to numeric in E16065 / R16065C5: '1'
## Warning: Coercing text to numeric in E16066 / R16066C5: '1'
## Warning: Coercing text to numeric in E16067 / R16067C5: '1'
## Warning: Coercing text to numeric in E16068 / R16068C5: '1'
## Warning: Coercing text to numeric in E16069 / R16069C5: '1'
## Warning: Coercing text to numeric in E16070 / R16070C5: '1'
## Warning: Coercing text to numeric in E16071 / R16071C5: '1'
## Warning: Coercing text to numeric in E16072 / R16072C5: '1'
## Warning: Coercing text to numeric in E16073 / R16073C5: '1'
## Warning: Coercing text to numeric in E16074 / R16074C5: '1'
## Warning: Coercing text to numeric in E16075 / R16075C5: '1'
## Warning: Coercing text to numeric in E16076 / R16076C5: '2'
## Warning: Coercing text to numeric in E16077 / R16077C5: '2'
## Warning: Coercing text to numeric in E16078 / R16078C5: '2'
## Warning: Coercing text to numeric in E16079 / R16079C5: '2'
## Warning: Coercing text to numeric in E16080 / R16080C5: '2'
## Warning: Coercing text to numeric in E16081 / R16081C5: '2'
## Warning: Coercing text to numeric in E16082 / R16082C5: '2'
## Warning: Coercing text to numeric in E16083 / R16083C5: '2'
## Warning: Coercing text to numeric in E16084 / R16084C5: '2'
## Warning: Coercing text to numeric in E16085 / R16085C5: '2'
## Warning: Coercing text to numeric in E16086 / R16086C5: '2'
## Warning: Coercing text to numeric in E16087 / R16087C5: '2'
## Warning: Coercing text to numeric in E16088 / R16088C5: '2'
## Warning: Coercing text to numeric in E16089 / R16089C5: '2'
## Warning: Coercing text to numeric in E16090 / R16090C5: '2'
## Warning: Coercing text to numeric in E16091 / R16091C5: '2'
## Warning: Coercing text to numeric in E16092 / R16092C5: '2'
## Warning: Coercing text to numeric in E16093 / R16093C5: '2'
## Warning: Coercing text to numeric in E16094 / R16094C5: '1'
## Warning: Coercing text to numeric in E16095 / R16095C5: '1'
## Warning: Coercing text to numeric in E16096 / R16096C5: '1'
## Warning: Coercing text to numeric in E16097 / R16097C5: '1'
## Warning: Coercing text to numeric in E16098 / R16098C5: '1'
## Warning: Coercing text to numeric in E16099 / R16099C5: '1'
## Warning: Coercing text to numeric in E16100 / R16100C5: '2'
## Warning: Coercing text to numeric in E16101 / R16101C5: '2'
## Warning: Coercing text to numeric in E16102 / R16102C5: '2'
## Warning: Coercing text to numeric in E16103 / R16103C5: '2'
## Warning: Coercing text to numeric in E16104 / R16104C5: '2'
## Warning: Coercing text to numeric in E16105 / R16105C5: '2'
## Warning: Coercing text to numeric in E16106 / R16106C5: '1'
## Warning: Coercing text to numeric in E16107 / R16107C5: '1'
## Warning: Coercing text to numeric in E16108 / R16108C5: '1'
## Warning: Coercing text to numeric in E16109 / R16109C5: '1'
## Warning: Coercing text to numeric in E16110 / R16110C5: '1'
## Warning: Coercing text to numeric in E16111 / R16111C5: '1'
## Warning: Coercing text to numeric in E16112 / R16112C5: '2'
## Warning: Coercing text to numeric in E16113 / R16113C5: '2'
## Warning: Coercing text to numeric in E16114 / R16114C5: '2'
## Warning: Coercing text to numeric in E16115 / R16115C5: '2'
## Warning: Coercing text to numeric in E16116 / R16116C5: '2'
## Warning: Coercing text to numeric in E16117 / R16117C5: '2'
## Warning: Coercing text to numeric in E16118 / R16118C5: '1'
## Warning: Coercing text to numeric in E16119 / R16119C5: '1'
## Warning: Coercing text to numeric in E16120 / R16120C5: '1'
## Warning: Coercing text to numeric in E16121 / R16121C5: '1'
## Warning: Coercing text to numeric in E16122 / R16122C5: '1'
## Warning: Coercing text to numeric in E16123 / R16123C5: '1'
## Warning: Coercing text to numeric in E16124 / R16124C5: '1'
## Warning: Coercing text to numeric in E16125 / R16125C5: '1'
## Warning: Coercing text to numeric in E16126 / R16126C5: '1'
## Warning: Coercing text to numeric in E16127 / R16127C5: '1'
## Warning: Coercing text to numeric in E16128 / R16128C5: '1'
## Warning: Coercing text to numeric in E16129 / R16129C5: '1'
## Warning: Coercing text to numeric in E16130 / R16130C5: '2'
## Warning: Coercing text to numeric in E16131 / R16131C5: '2'
## Warning: Coercing text to numeric in E16132 / R16132C5: '2'
## Warning: Coercing text to numeric in E16133 / R16133C5: '2'
## Warning: Coercing text to numeric in E16134 / R16134C5: '2'
## Warning: Coercing text to numeric in E16135 / R16135C5: '2'
## Warning: Coercing text to numeric in E16136 / R16136C5: '2'
## Warning: Coercing text to numeric in E16137 / R16137C5: '2'
## Warning: Coercing text to numeric in E16138 / R16138C5: '2'
## Warning: Coercing text to numeric in E16139 / R16139C5: '2'
## Warning: Coercing text to numeric in E16140 / R16140C5: '2'
## Warning: Coercing text to numeric in E16141 / R16141C5: '2'
## Warning: Coercing text to numeric in E16142 / R16142C5: '1'
## Warning: Coercing text to numeric in E16143 / R16143C5: '1'
## Warning: Coercing text to numeric in E16144 / R16144C5: '1'
## Warning: Coercing text to numeric in E16145 / R16145C5: '1'
## Warning: Coercing text to numeric in E16146 / R16146C5: '1'
## Warning: Coercing text to numeric in E16147 / R16147C5: '1'
## Warning: Coercing text to numeric in E16148 / R16148C5: '2'
## Warning: Coercing text to numeric in E16149 / R16149C5: '2'
## Warning: Coercing text to numeric in E16150 / R16150C5: '2'
## Warning: Coercing text to numeric in E16151 / R16151C5: '2'
## Warning: Coercing text to numeric in E16152 / R16152C5: '2'
## Warning: Coercing text to numeric in E16153 / R16153C5: '2'
## Warning: Coercing text to numeric in E16154 / R16154C5: '1'
## Warning: Coercing text to numeric in E16155 / R16155C5: '1'
## Warning: Coercing text to numeric in E16156 / R16156C5: '1'
## Warning: Coercing text to numeric in E16157 / R16157C5: '1'
## Warning: Coercing text to numeric in E16158 / R16158C5: '1'
## Warning: Coercing text to numeric in E16159 / R16159C5: '1'
## Warning: Coercing text to numeric in E16160 / R16160C5: '1'
## Warning: Coercing text to numeric in E16161 / R16161C5: '1'
## Warning: Coercing text to numeric in E16162 / R16162C5: '1'
## Warning: Coercing text to numeric in E16163 / R16163C5: '1'
## Warning: Coercing text to numeric in E16164 / R16164C5: '1'
## Warning: Coercing text to numeric in E16165 / R16165C5: '1'
## Warning: Coercing text to numeric in E16166 / R16166C5: '2'
## Warning: Coercing text to numeric in E16167 / R16167C5: '2'
## Warning: Coercing text to numeric in E16168 / R16168C5: '2'
## Warning: Coercing text to numeric in E16169 / R16169C5: '2'
## Warning: Coercing text to numeric in E16170 / R16170C5: '2'
## Warning: Coercing text to numeric in E16171 / R16171C5: '2'
## Warning: Coercing text to numeric in E16172 / R16172C5: '1'
## Warning: Coercing text to numeric in E16173 / R16173C5: '1'
## Warning: Coercing text to numeric in E16174 / R16174C5: '1'
## Warning: Coercing text to numeric in E16175 / R16175C5: '1'
## Warning: Coercing text to numeric in E16176 / R16176C5: '1'
## Warning: Coercing text to numeric in E16177 / R16177C5: '1'
## Warning: Coercing text to numeric in E16178 / R16178C5: '2'
## Warning: Coercing text to numeric in E16179 / R16179C5: '2'
## Warning: Coercing text to numeric in E16180 / R16180C5: '2'
## Warning: Coercing text to numeric in E16181 / R16181C5: '2'
## Warning: Coercing text to numeric in E16182 / R16182C5: '2'
## Warning: Coercing text to numeric in E16183 / R16183C5: '2'
## Warning: Coercing text to numeric in E16184 / R16184C5: '1'
## Warning: Coercing text to numeric in E16185 / R16185C5: '1'
## Warning: Coercing text to numeric in E16186 / R16186C5: '1'
## Warning: Coercing text to numeric in E16187 / R16187C5: '1'
## Warning: Coercing text to numeric in E16188 / R16188C5: '1'
## Warning: Coercing text to numeric in E16189 / R16189C5: '1'
## Warning: Coercing text to numeric in E16190 / R16190C5: '1'
## Warning: Coercing text to numeric in E16191 / R16191C5: '1'
## Warning: Coercing text to numeric in E16192 / R16192C5: '1'
## Warning: Coercing text to numeric in E16193 / R16193C5: '1'
## Warning: Coercing text to numeric in E16194 / R16194C5: '1'
## Warning: Coercing text to numeric in E16195 / R16195C5: '1'
## Warning: Coercing text to numeric in E16196 / R16196C5: '2'
## Warning: Coercing text to numeric in E16197 / R16197C5: '2'
## Warning: Coercing text to numeric in E16198 / R16198C5: '2'
## Warning: Coercing text to numeric in E16199 / R16199C5: '2'
## Warning: Coercing text to numeric in E16200 / R16200C5: '2'
## Warning: Coercing text to numeric in E16201 / R16201C5: '2'
## Warning: Coercing text to numeric in E16202 / R16202C5: '2'
## Warning: Coercing text to numeric in E16203 / R16203C5: '2'
## Warning: Coercing text to numeric in E16204 / R16204C5: '2'
## Warning: Coercing text to numeric in E16205 / R16205C5: '2'
## Warning: Coercing text to numeric in E16206 / R16206C5: '2'
## Warning: Coercing text to numeric in E16207 / R16207C5: '2'
## Warning: Coercing text to numeric in E16208 / R16208C5: '2'
## Warning: Coercing text to numeric in E16209 / R16209C5: '2'
## Warning: Coercing text to numeric in E16210 / R16210C5: '2'
## Warning: Coercing text to numeric in E16211 / R16211C5: '2'
## Warning: Coercing text to numeric in E16212 / R16212C5: '2'
## Warning: Coercing text to numeric in E16213 / R16213C5: '2'
## Warning: Coercing text to numeric in E16214 / R16214C5: '1'
## Warning: Coercing text to numeric in E16215 / R16215C5: '1'
## Warning: Coercing text to numeric in E16216 / R16216C5: '1'
## Warning: Coercing text to numeric in E16217 / R16217C5: '1'
## Warning: Coercing text to numeric in E16218 / R16218C5: '1'
## Warning: Coercing text to numeric in E16219 / R16219C5: '1'
## Warning: Coercing text to numeric in E16220 / R16220C5: '2'
## Warning: Coercing text to numeric in E16221 / R16221C5: '2'
## Warning: Coercing text to numeric in E16222 / R16222C5: '2'
## Warning: Coercing text to numeric in E16223 / R16223C5: '2'
## Warning: Coercing text to numeric in E16224 / R16224C5: '2'
## Warning: Coercing text to numeric in E16225 / R16225C5: '2'
## Warning: Coercing text to numeric in E16226 / R16226C5: '2'
## Warning: Coercing text to numeric in E16227 / R16227C5: '2'
## Warning: Coercing text to numeric in E16228 / R16228C5: '2'
## Warning: Coercing text to numeric in E16229 / R16229C5: '2'
## Warning: Coercing text to numeric in E16230 / R16230C5: '2'
## Warning: Coercing text to numeric in E16231 / R16231C5: '2'
## Warning: Coercing text to numeric in E16232 / R16232C5: '1'
## Warning: Coercing text to numeric in E16233 / R16233C5: '1'
## Warning: Coercing text to numeric in E16234 / R16234C5: '1'
## Warning: Coercing text to numeric in E16235 / R16235C5: '1'
## Warning: Coercing text to numeric in E16236 / R16236C5: '1'
## Warning: Coercing text to numeric in E16237 / R16237C5: '1'
## Warning: Coercing text to numeric in E16238 / R16238C5: '2'
## Warning: Coercing text to numeric in E16239 / R16239C5: '2'
## Warning: Coercing text to numeric in E16240 / R16240C5: '2'
## Warning: Coercing text to numeric in E16241 / R16241C5: '2'
## Warning: Coercing text to numeric in E16242 / R16242C5: '2'
## Warning: Coercing text to numeric in E16243 / R16243C5: '2'
## Warning: Coercing text to numeric in E16244 / R16244C5: '1'
## Warning: Coercing text to numeric in E16245 / R16245C5: '1'
## Warning: Coercing text to numeric in E16246 / R16246C5: '1'
## Warning: Coercing text to numeric in E16247 / R16247C5: '1'
## Warning: Coercing text to numeric in E16248 / R16248C5: '1'
## Warning: Coercing text to numeric in E16249 / R16249C5: '1'
## Warning: Coercing text to numeric in E16250 / R16250C5: '1'
## Warning: Coercing text to numeric in E16251 / R16251C5: '1'
## Warning: Coercing text to numeric in E16252 / R16252C5: '1'
## Warning: Coercing text to numeric in E16253 / R16253C5: '1'
## Warning: Coercing text to numeric in E16254 / R16254C5: '1'
## Warning: Coercing text to numeric in E16255 / R16255C5: '1'
## Warning: Coercing text to numeric in E16256 / R16256C5: '1'
## Warning: Coercing text to numeric in E16257 / R16257C5: '1'
## Warning: Coercing text to numeric in E16258 / R16258C5: '1'
## Warning: Coercing text to numeric in E16259 / R16259C5: '1'
## Warning: Coercing text to numeric in E16260 / R16260C5: '1'
## Warning: Coercing text to numeric in E16261 / R16261C5: '1'
## Warning: Coercing text to numeric in E16262 / R16262C5: '1'
## Warning: Coercing text to numeric in E16263 / R16263C5: '1'
## Warning: Coercing text to numeric in E16264 / R16264C5: '1'
## Warning: Coercing text to numeric in E16265 / R16265C5: '1'
## Warning: Coercing text to numeric in E16266 / R16266C5: '1'
## Warning: Coercing text to numeric in E16267 / R16267C5: '1'
## Warning: Coercing text to numeric in E16268 / R16268C5: '2'
## Warning: Coercing text to numeric in E16269 / R16269C5: '2'
## Warning: Coercing text to numeric in E16270 / R16270C5: '2'
## Warning: Coercing text to numeric in E16271 / R16271C5: '2'
## Warning: Coercing text to numeric in E16272 / R16272C5: '2'
## Warning: Coercing text to numeric in E16273 / R16273C5: '2'
## Warning: Coercing text to numeric in E16274 / R16274C5: '1'
## Warning: Coercing text to numeric in E16275 / R16275C5: '1'
## Warning: Coercing text to numeric in E16276 / R16276C5: '1'
## Warning: Coercing text to numeric in E16277 / R16277C5: '1'
## Warning: Coercing text to numeric in E16278 / R16278C5: '1'
## Warning: Coercing text to numeric in E16279 / R16279C5: '1'
## Warning: Coercing text to numeric in E16280 / R16280C5: '2'
## Warning: Coercing text to numeric in E16281 / R16281C5: '2'
## Warning: Coercing text to numeric in E16282 / R16282C5: '2'
## Warning: Coercing text to numeric in E16283 / R16283C5: '2'
## Warning: Coercing text to numeric in E16284 / R16284C5: '2'
## Warning: Coercing text to numeric in E16285 / R16285C5: '2'
## Warning: Coercing text to numeric in E16286 / R16286C5: '2'
## Warning: Coercing text to numeric in E16287 / R16287C5: '2'
## Warning: Coercing text to numeric in E16288 / R16288C5: '2'
## Warning: Coercing text to numeric in E16289 / R16289C5: '2'
## Warning: Coercing text to numeric in E16290 / R16290C5: '2'
## Warning: Coercing text to numeric in E16291 / R16291C5: '2'
## Warning: Coercing text to numeric in E16292 / R16292C5: '2'
## Warning: Coercing text to numeric in E16293 / R16293C5: '2'
## Warning: Coercing text to numeric in E16294 / R16294C5: '2'
## Warning: Coercing text to numeric in E16295 / R16295C5: '2'
## Warning: Coercing text to numeric in E16296 / R16296C5: '2'
## Warning: Coercing text to numeric in E16297 / R16297C5: '2'
## Warning: Coercing text to numeric in E16298 / R16298C5: '2'
## Warning: Coercing text to numeric in E16299 / R16299C5: '2'
## Warning: Coercing text to numeric in E16300 / R16300C5: '2'
## Warning: Coercing text to numeric in E16301 / R16301C5: '2'
## Warning: Coercing text to numeric in E16302 / R16302C5: '2'
## Warning: Coercing text to numeric in E16303 / R16303C5: '2'
## Warning: Coercing text to numeric in E16304 / R16304C5: '2'
## Warning: Coercing text to numeric in E16305 / R16305C5: '2'
## Warning: Coercing text to numeric in E16306 / R16306C5: '2'
## Warning: Coercing text to numeric in E16307 / R16307C5: '2'
## Warning: Coercing text to numeric in E16308 / R16308C5: '2'
## Warning: Coercing text to numeric in E16309 / R16309C5: '2'
## Warning: Coercing text to numeric in E16310 / R16310C5: '2'
## Warning: Coercing text to numeric in E16311 / R16311C5: '2'
## Warning: Coercing text to numeric in E16312 / R16312C5: '2'
## Warning: Coercing text to numeric in E16313 / R16313C5: '2'
## Warning: Coercing text to numeric in E16314 / R16314C5: '2'
## Warning: Coercing text to numeric in E16315 / R16315C5: '2'
## Warning: Coercing text to numeric in E16316 / R16316C5: '2'
## Warning: Coercing text to numeric in E16317 / R16317C5: '2'
## Warning: Coercing text to numeric in E16318 / R16318C5: '2'
## Warning: Coercing text to numeric in E16319 / R16319C5: '2'
## Warning: Coercing text to numeric in E16320 / R16320C5: '2'
## Warning: Coercing text to numeric in E16321 / R16321C5: '2'
## Warning: Coercing text to numeric in E16322 / R16322C5: '1'
## Warning: Coercing text to numeric in E16323 / R16323C5: '1'
## Warning: Coercing text to numeric in E16324 / R16324C5: '1'
## Warning: Coercing text to numeric in E16325 / R16325C5: '1'
## Warning: Coercing text to numeric in E16326 / R16326C5: '1'
## Warning: Coercing text to numeric in E16327 / R16327C5: '1'
## Warning: Coercing text to numeric in E16328 / R16328C5: '1'
## Warning: Coercing text to numeric in E16329 / R16329C5: '1'
## Warning: Coercing text to numeric in E16330 / R16330C5: '1'
## Warning: Coercing text to numeric in E16331 / R16331C5: '1'
## Warning: Coercing text to numeric in E16332 / R16332C5: '1'
## Warning: Coercing text to numeric in E16333 / R16333C5: '1'
## Warning: Coercing text to numeric in E16334 / R16334C5: '2'
## Warning: Coercing text to numeric in E16335 / R16335C5: '2'
## Warning: Coercing text to numeric in E16336 / R16336C5: '2'
## Warning: Coercing text to numeric in E16337 / R16337C5: '2'
## Warning: Coercing text to numeric in E16338 / R16338C5: '2'
## Warning: Coercing text to numeric in E16339 / R16339C5: '2'
## Warning: Coercing text to numeric in E16340 / R16340C5: '1'
## Warning: Coercing text to numeric in E16341 / R16341C5: '1'
## Warning: Coercing text to numeric in E16342 / R16342C5: '1'
## Warning: Coercing text to numeric in E16343 / R16343C5: '1'
## Warning: Coercing text to numeric in E16344 / R16344C5: '1'
## Warning: Coercing text to numeric in E16345 / R16345C5: '1'
## Warning: Coercing text to numeric in E16346 / R16346C5: '2'
## Warning: Coercing text to numeric in E16347 / R16347C5: '2'
## Warning: Coercing text to numeric in E16348 / R16348C5: '2'
## Warning: Coercing text to numeric in E16349 / R16349C5: '2'
## Warning: Coercing text to numeric in E16350 / R16350C5: '2'
## Warning: Coercing text to numeric in E16351 / R16351C5: '2'
## Warning: Coercing text to numeric in E16352 / R16352C5: '1'
## Warning: Coercing text to numeric in E16353 / R16353C5: '1'
## Warning: Coercing text to numeric in E16354 / R16354C5: '1'
## Warning: Coercing text to numeric in E16355 / R16355C5: '1'
## Warning: Coercing text to numeric in E16356 / R16356C5: '1'
## Warning: Coercing text to numeric in E16357 / R16357C5: '1'
## Warning: Coercing text to numeric in E16358 / R16358C5: '2'
## Warning: Coercing text to numeric in E16359 / R16359C5: '2'
## Warning: Coercing text to numeric in E16360 / R16360C5: '2'
## Warning: Coercing text to numeric in E16361 / R16361C5: '2'
## Warning: Coercing text to numeric in E16362 / R16362C5: '2'
## Warning: Coercing text to numeric in E16363 / R16363C5: '2'
## Warning: Coercing text to numeric in E16364 / R16364C5: '2'
## Warning: Coercing text to numeric in E16365 / R16365C5: '2'
## Warning: Coercing text to numeric in E16366 / R16366C5: '2'
## Warning: Coercing text to numeric in E16367 / R16367C5: '2'
## Warning: Coercing text to numeric in E16368 / R16368C5: '2'
## Warning: Coercing text to numeric in E16369 / R16369C5: '2'
## Warning: Coercing text to numeric in E16370 / R16370C5: '2'
## Warning: Coercing text to numeric in E16371 / R16371C5: '2'
## Warning: Coercing text to numeric in E16372 / R16372C5: '2'
## Warning: Coercing text to numeric in E16373 / R16373C5: '2'
## Warning: Coercing text to numeric in E16374 / R16374C5: '2'
## Warning: Coercing text to numeric in E16375 / R16375C5: '2'
## Warning: Coercing text to numeric in E16376 / R16376C5: '1'
## Warning: Coercing text to numeric in E16377 / R16377C5: '1'
## Warning: Coercing text to numeric in E16378 / R16378C5: '1'
## Warning: Coercing text to numeric in E16379 / R16379C5: '1'
## Warning: Coercing text to numeric in E16380 / R16380C5: '1'
## Warning: Coercing text to numeric in E16381 / R16381C5: '1'
## Warning: Coercing text to numeric in E16382 / R16382C5: '2'
## Warning: Coercing text to numeric in E16383 / R16383C5: '2'
## Warning: Coercing text to numeric in E16384 / R16384C5: '2'
## Warning: Coercing text to numeric in E16385 / R16385C5: '2'
## Warning: Coercing text to numeric in E16386 / R16386C5: '2'
## Warning: Coercing text to numeric in E16387 / R16387C5: '2'
## Warning: Coercing text to numeric in E16388 / R16388C5: '1'
## Warning: Coercing text to numeric in E16389 / R16389C5: '1'
## Warning: Coercing text to numeric in E16390 / R16390C5: '1'
## Warning: Coercing text to numeric in E16391 / R16391C5: '1'
## Warning: Coercing text to numeric in E16392 / R16392C5: '1'
## Warning: Coercing text to numeric in E16393 / R16393C5: '1'
## Warning: Coercing text to numeric in E16394 / R16394C5: '1'
## Warning: Coercing text to numeric in E16395 / R16395C5: '1'
## Warning: Coercing text to numeric in E16396 / R16396C5: '1'
## Warning: Coercing text to numeric in E16397 / R16397C5: '1'
## Warning: Coercing text to numeric in E16398 / R16398C5: '1'
## Warning: Coercing text to numeric in E16399 / R16399C5: '1'
## Warning: Coercing text to numeric in E16400 / R16400C5: '1'
## Warning: Coercing text to numeric in E16401 / R16401C5: '1'
## Warning: Coercing text to numeric in E16402 / R16402C5: '1'
## Warning: Coercing text to numeric in E16403 / R16403C5: '1'
## Warning: Coercing text to numeric in E16404 / R16404C5: '1'
## Warning: Coercing text to numeric in E16405 / R16405C5: '1'
## Warning: Coercing text to numeric in E16406 / R16406C5: '2'
## Warning: Coercing text to numeric in E16407 / R16407C5: '2'
## Warning: Coercing text to numeric in E16408 / R16408C5: '2'
## Warning: Coercing text to numeric in E16409 / R16409C5: '2'
## Warning: Coercing text to numeric in E16410 / R16410C5: '2'
## Warning: Coercing text to numeric in E16411 / R16411C5: '2'
## Warning: Coercing text to numeric in E16412 / R16412C5: '2'
## Warning: Coercing text to numeric in E16413 / R16413C5: '2'
## Warning: Coercing text to numeric in E16414 / R16414C5: '2'
## Warning: Coercing text to numeric in E16415 / R16415C5: '2'
## Warning: Coercing text to numeric in E16416 / R16416C5: '2'
## Warning: Coercing text to numeric in E16417 / R16417C5: '2'
## Warning: Coercing text to numeric in E16418 / R16418C5: '2'
## Warning: Coercing text to numeric in E16419 / R16419C5: '2'
## Warning: Coercing text to numeric in E16420 / R16420C5: '2'
## Warning: Coercing text to numeric in E16421 / R16421C5: '2'
## Warning: Coercing text to numeric in E16422 / R16422C5: '2'
## Warning: Coercing text to numeric in E16423 / R16423C5: '2'
## Warning: Coercing text to numeric in E16424 / R16424C5: '1'
## Warning: Coercing text to numeric in E16425 / R16425C5: '1'
## Warning: Coercing text to numeric in E16426 / R16426C5: '1'
## Warning: Coercing text to numeric in E16427 / R16427C5: '1'
## Warning: Coercing text to numeric in E16428 / R16428C5: '1'
## Warning: Coercing text to numeric in E16429 / R16429C5: '1'
## Warning: Coercing text to numeric in E16430 / R16430C5: '1'
## Warning: Coercing text to numeric in E16431 / R16431C5: '1'
## Warning: Coercing text to numeric in E16432 / R16432C5: '1'
## Warning: Coercing text to numeric in E16433 / R16433C5: '1'
## Warning: Coercing text to numeric in E16434 / R16434C5: '1'
## Warning: Coercing text to numeric in E16435 / R16435C5: '1'
## Warning: Coercing text to numeric in E16436 / R16436C5: '1'
## Warning: Coercing text to numeric in E16437 / R16437C5: '1'
## Warning: Coercing text to numeric in E16438 / R16438C5: '1'
## Warning: Coercing text to numeric in E16439 / R16439C5: '1'
## Warning: Coercing text to numeric in E16440 / R16440C5: '1'
## Warning: Coercing text to numeric in E16441 / R16441C5: '1'
## Warning: Coercing text to numeric in E16442 / R16442C5: '1'
## Warning: Coercing text to numeric in E16443 / R16443C5: '1'
## Warning: Coercing text to numeric in E16444 / R16444C5: '1'
## Warning: Coercing text to numeric in E16445 / R16445C5: '1'
## Warning: Coercing text to numeric in E16446 / R16446C5: '1'
## Warning: Coercing text to numeric in E16447 / R16447C5: '1'
## Warning: Coercing text to numeric in E16448 / R16448C5: '1'
## Warning: Coercing text to numeric in E16449 / R16449C5: '1'
## Warning: Coercing text to numeric in E16450 / R16450C5: '1'
## Warning: Coercing text to numeric in E16451 / R16451C5: '1'
## Warning: Coercing text to numeric in E16452 / R16452C5: '1'
## Warning: Coercing text to numeric in E16453 / R16453C5: '1'
## Warning: Coercing text to numeric in E16454 / R16454C5: '2'
## Warning: Coercing text to numeric in E16455 / R16455C5: '2'
## Warning: Coercing text to numeric in E16456 / R16456C5: '2'
## Warning: Coercing text to numeric in E16457 / R16457C5: '2'
## Warning: Coercing text to numeric in E16458 / R16458C5: '2'
## Warning: Coercing text to numeric in E16459 / R16459C5: '2'
## Warning: Coercing text to numeric in E16460 / R16460C5: '1'
## Warning: Coercing text to numeric in E16461 / R16461C5: '1'
## Warning: Coercing text to numeric in E16462 / R16462C5: '1'
## Warning: Coercing text to numeric in E16463 / R16463C5: '1'
## Warning: Coercing text to numeric in E16464 / R16464C5: '1'
## Warning: Coercing text to numeric in E16465 / R16465C5: '1'
## Warning: Coercing text to numeric in E16466 / R16466C5: '2'
## Warning: Coercing text to numeric in E16467 / R16467C5: '2'
## Warning: Coercing text to numeric in E16468 / R16468C5: '2'
## Warning: Coercing text to numeric in E16469 / R16469C5: '2'
## Warning: Coercing text to numeric in E16470 / R16470C5: '2'
## Warning: Coercing text to numeric in E16471 / R16471C5: '2'
## Warning: Coercing text to numeric in E16472 / R16472C5: '2'
## Warning: Coercing text to numeric in E16473 / R16473C5: '2'
## Warning: Coercing text to numeric in E16474 / R16474C5: '2'
## Warning: Coercing text to numeric in E16475 / R16475C5: '2'
## Warning: Coercing text to numeric in E16476 / R16476C5: '2'
## Warning: Coercing text to numeric in E16477 / R16477C5: '2'
## Warning: Coercing text to numeric in E16478 / R16478C5: '1'
## Warning: Coercing text to numeric in E16479 / R16479C5: '1'
## Warning: Coercing text to numeric in E16480 / R16480C5: '1'
## Warning: Coercing text to numeric in E16481 / R16481C5: '1'
## Warning: Coercing text to numeric in E16482 / R16482C5: '1'
## Warning: Coercing text to numeric in E16483 / R16483C5: '1'
## Warning: Coercing text to numeric in E16484 / R16484C5: '2'
## Warning: Coercing text to numeric in E16485 / R16485C5: '2'
## Warning: Coercing text to numeric in E16486 / R16486C5: '2'
## Warning: Coercing text to numeric in E16487 / R16487C5: '2'
## Warning: Coercing text to numeric in E16488 / R16488C5: '2'
## Warning: Coercing text to numeric in E16489 / R16489C5: '2'
## Warning: Coercing text to numeric in E16490 / R16490C5: '2'
## Warning: Coercing text to numeric in E16491 / R16491C5: '2'
## Warning: Coercing text to numeric in E16492 / R16492C5: '2'
## Warning: Coercing text to numeric in E16493 / R16493C5: '2'
## Warning: Coercing text to numeric in E16494 / R16494C5: '2'
## Warning: Coercing text to numeric in E16495 / R16495C5: '2'
## Warning: Coercing text to numeric in E16496 / R16496C5: '1'
## Warning: Coercing text to numeric in E16497 / R16497C5: '1'
## Warning: Coercing text to numeric in E16498 / R16498C5: '1'
## Warning: Coercing text to numeric in E16499 / R16499C5: '1'
## Warning: Coercing text to numeric in E16500 / R16500C5: '1'
## Warning: Coercing text to numeric in E16501 / R16501C5: '1'
## Warning: Coercing text to numeric in E16502 / R16502C5: '1'
## Warning: Coercing text to numeric in E16503 / R16503C5: '1'
## Warning: Coercing text to numeric in E16504 / R16504C5: '1'
## Warning: Coercing text to numeric in E16505 / R16505C5: '1'
## Warning: Coercing text to numeric in E16506 / R16506C5: '1'
## Warning: Coercing text to numeric in E16507 / R16507C5: '1'
## Warning: Coercing text to numeric in E16508 / R16508C5: '1'
## Warning: Coercing text to numeric in E16509 / R16509C5: '1'
## Warning: Coercing text to numeric in E16510 / R16510C5: '1'
## Warning: Coercing text to numeric in E16511 / R16511C5: '1'
## Warning: Coercing text to numeric in E16512 / R16512C5: '1'
## Warning: Coercing text to numeric in E16513 / R16513C5: '1'
## Warning: Coercing text to numeric in E16514 / R16514C5: '1'
## Warning: Coercing text to numeric in E16515 / R16515C5: '1'
## Warning: Coercing text to numeric in E16516 / R16516C5: '1'
## Warning: Coercing text to numeric in E16517 / R16517C5: '1'
## Warning: Coercing text to numeric in E16518 / R16518C5: '1'
## Warning: Coercing text to numeric in E16519 / R16519C5: '1'
## Warning: Coercing text to numeric in E16520 / R16520C5: '1'
## Warning: Coercing text to numeric in E16521 / R16521C5: '1'
## Warning: Coercing text to numeric in E16522 / R16522C5: '1'
## Warning: Coercing text to numeric in E16523 / R16523C5: '1'
## Warning: Coercing text to numeric in E16524 / R16524C5: '1'
## Warning: Coercing text to numeric in E16525 / R16525C5: '1'
## Warning: Coercing text to numeric in E16526 / R16526C5: '2'
## Warning: Coercing text to numeric in E16527 / R16527C5: '2'
## Warning: Coercing text to numeric in E16528 / R16528C5: '2'
## Warning: Coercing text to numeric in E16529 / R16529C5: '2'
## Warning: Coercing text to numeric in E16530 / R16530C5: '2'
## Warning: Coercing text to numeric in E16531 / R16531C5: '2'
## Warning: Coercing text to numeric in E16532 / R16532C5: '1'
## Warning: Coercing text to numeric in E16533 / R16533C5: '1'
## Warning: Coercing text to numeric in E16534 / R16534C5: '1'
## Warning: Coercing text to numeric in E16535 / R16535C5: '1'
## Warning: Coercing text to numeric in E16536 / R16536C5: '1'
## Warning: Coercing text to numeric in E16537 / R16537C5: '1'
## Warning: Coercing text to numeric in E16538 / R16538C5: '2'
## Warning: Coercing text to numeric in E16539 / R16539C5: '2'
## Warning: Coercing text to numeric in E16540 / R16540C5: '2'
## Warning: Coercing text to numeric in E16541 / R16541C5: '2'
## Warning: Coercing text to numeric in E16542 / R16542C5: '2'
## Warning: Coercing text to numeric in E16543 / R16543C5: '2'
## Warning: Coercing text to numeric in E16544 / R16544C5: '2'
## Warning: Coercing text to numeric in E16545 / R16545C5: '2'
## Warning: Coercing text to numeric in E16546 / R16546C5: '2'
## Warning: Coercing text to numeric in E16547 / R16547C5: '2'
## Warning: Coercing text to numeric in E16548 / R16548C5: '2'
## Warning: Coercing text to numeric in E16549 / R16549C5: '2'
## Warning: Coercing text to numeric in E16550 / R16550C5: '2'
## Warning: Coercing text to numeric in E16551 / R16551C5: '2'
## Warning: Coercing text to numeric in E16552 / R16552C5: '2'
## Warning: Coercing text to numeric in E16553 / R16553C5: '2'
## Warning: Coercing text to numeric in E16554 / R16554C5: '2'
## Warning: Coercing text to numeric in E16555 / R16555C5: '2'
## Warning: Coercing text to numeric in E16556 / R16556C5: '2'
## Warning: Coercing text to numeric in E16557 / R16557C5: '2'
## Warning: Coercing text to numeric in E16558 / R16558C5: '2'
## Warning: Coercing text to numeric in E16559 / R16559C5: '2'
## Warning: Coercing text to numeric in E16560 / R16560C5: '2'
## Warning: Coercing text to numeric in E16561 / R16561C5: '2'
## Warning: Coercing text to numeric in E16562 / R16562C5: '2'
## Warning: Coercing text to numeric in E16563 / R16563C5: '2'
## Warning: Coercing text to numeric in E16564 / R16564C5: '2'
## Warning: Coercing text to numeric in E16565 / R16565C5: '2'
## Warning: Coercing text to numeric in E16566 / R16566C5: '2'
## Warning: Coercing text to numeric in E16567 / R16567C5: '2'
## Warning: Coercing text to numeric in E16568 / R16568C5: '2'
## Warning: Coercing text to numeric in E16569 / R16569C5: '2'
## Warning: Coercing text to numeric in E16570 / R16570C5: '2'
## Warning: Coercing text to numeric in E16571 / R16571C5: '2'
## Warning: Coercing text to numeric in E16572 / R16572C5: '2'
## Warning: Coercing text to numeric in E16573 / R16573C5: '2'
## Warning: Coercing text to numeric in E16574 / R16574C5: '2'
## Warning: Coercing text to numeric in E16575 / R16575C5: '2'
## Warning: Coercing text to numeric in E16576 / R16576C5: '2'
## Warning: Coercing text to numeric in E16577 / R16577C5: '2'
## Warning: Coercing text to numeric in E16578 / R16578C5: '2'
## Warning: Coercing text to numeric in E16579 / R16579C5: '2'
## Warning: Coercing text to numeric in E16580 / R16580C5: '1'
## Warning: Coercing text to numeric in E16581 / R16581C5: '1'
## Warning: Coercing text to numeric in E16582 / R16582C5: '1'
## Warning: Coercing text to numeric in E16583 / R16583C5: '1'
## Warning: Coercing text to numeric in E16584 / R16584C5: '1'
## Warning: Coercing text to numeric in E16585 / R16585C5: '1'
## Warning: Coercing text to numeric in E16586 / R16586C5: '2'
## Warning: Coercing text to numeric in E16587 / R16587C5: '2'
## Warning: Coercing text to numeric in E16588 / R16588C5: '2'
## Warning: Coercing text to numeric in E16589 / R16589C5: '2'
## Warning: Coercing text to numeric in E16590 / R16590C5: '2'
## Warning: Coercing text to numeric in E16591 / R16591C5: '2'
## Warning: Coercing text to numeric in E16592 / R16592C5: '2'
## Warning: Coercing text to numeric in E16593 / R16593C5: '2'
## Warning: Coercing text to numeric in E16594 / R16594C5: '2'
## Warning: Coercing text to numeric in E16595 / R16595C5: '2'
## Warning: Coercing text to numeric in E16596 / R16596C5: '2'
## Warning: Coercing text to numeric in E16597 / R16597C5: '2'
## Warning: Coercing text to numeric in E16598 / R16598C5: '2'
## Warning: Coercing text to numeric in E16599 / R16599C5: '2'
## Warning: Coercing text to numeric in E16600 / R16600C5: '2'
## Warning: Coercing text to numeric in E16601 / R16601C5: '2'
## Warning: Coercing text to numeric in E16602 / R16602C5: '2'
## Warning: Coercing text to numeric in E16603 / R16603C5: '2'
## Warning: Coercing text to numeric in E16604 / R16604C5: '1'
## Warning: Coercing text to numeric in E16605 / R16605C5: '1'
## Warning: Coercing text to numeric in E16606 / R16606C5: '1'
## Warning: Coercing text to numeric in E16607 / R16607C5: '1'
## Warning: Coercing text to numeric in E16608 / R16608C5: '1'
## Warning: Coercing text to numeric in E16609 / R16609C5: '1'
## Warning: Coercing text to numeric in E16610 / R16610C5: '1'
## Warning: Coercing text to numeric in E16611 / R16611C5: '1'
## Warning: Coercing text to numeric in E16612 / R16612C5: '1'
## Warning: Coercing text to numeric in E16613 / R16613C5: '1'
## Warning: Coercing text to numeric in E16614 / R16614C5: '1'
## Warning: Coercing text to numeric in E16615 / R16615C5: '1'
## Warning: Coercing text to numeric in E16616 / R16616C5: '2'
## Warning: Coercing text to numeric in E16617 / R16617C5: '2'
## Warning: Coercing text to numeric in E16618 / R16618C5: '2'
## Warning: Coercing text to numeric in E16619 / R16619C5: '2'
## Warning: Coercing text to numeric in E16620 / R16620C5: '2'
## Warning: Coercing text to numeric in E16621 / R16621C5: '2'
## Warning: Coercing text to numeric in E16622 / R16622C5: '1'
## Warning: Coercing text to numeric in E16623 / R16623C5: '1'
## Warning: Coercing text to numeric in E16624 / R16624C5: '1'
## Warning: Coercing text to numeric in E16625 / R16625C5: '1'
## Warning: Coercing text to numeric in E16626 / R16626C5: '1'
## Warning: Coercing text to numeric in E16627 / R16627C5: '1'
## Warning: Coercing text to numeric in E16628 / R16628C5: '2'
## Warning: Coercing text to numeric in E16629 / R16629C5: '2'
## Warning: Coercing text to numeric in E16630 / R16630C5: '2'
## Warning: Coercing text to numeric in E16631 / R16631C5: '2'
## Warning: Coercing text to numeric in E16632 / R16632C5: '2'
## Warning: Coercing text to numeric in E16633 / R16633C5: '2'
## Warning: Coercing text to numeric in E16634 / R16634C5: '2'
## Warning: Coercing text to numeric in E16635 / R16635C5: '2'
## Warning: Coercing text to numeric in E16636 / R16636C5: '2'
## Warning: Coercing text to numeric in E16637 / R16637C5: '2'
## Warning: Coercing text to numeric in E16638 / R16638C5: '2'
## Warning: Coercing text to numeric in E16639 / R16639C5: '2'
## Warning: Coercing text to numeric in E16640 / R16640C5: '2'
## Warning: Coercing text to numeric in E16641 / R16641C5: '2'
## Warning: Coercing text to numeric in E16642 / R16642C5: '2'
## Warning: Coercing text to numeric in E16643 / R16643C5: '2'
## Warning: Coercing text to numeric in E16644 / R16644C5: '2'
## Warning: Coercing text to numeric in E16645 / R16645C5: '2'
## Warning: Coercing text to numeric in E16646 / R16646C5: '2'
## Warning: Coercing text to numeric in E16647 / R16647C5: '2'
## Warning: Coercing text to numeric in E16648 / R16648C5: '2'
## Warning: Coercing text to numeric in E16649 / R16649C5: '2'
## Warning: Coercing text to numeric in E16650 / R16650C5: '2'
## Warning: Coercing text to numeric in E16651 / R16651C5: '2'
## Warning: Coercing text to numeric in E16652 / R16652C5: '1'
## Warning: Coercing text to numeric in E16653 / R16653C5: '1'
## Warning: Coercing text to numeric in E16654 / R16654C5: '1'
## Warning: Coercing text to numeric in E16655 / R16655C5: '1'
## Warning: Coercing text to numeric in E16656 / R16656C5: '1'
## Warning: Coercing text to numeric in E16657 / R16657C5: '1'
## Warning: Coercing text to numeric in E16658 / R16658C5: '2'
## Warning: Coercing text to numeric in E16659 / R16659C5: '2'
## Warning: Coercing text to numeric in E16660 / R16660C5: '2'
## Warning: Coercing text to numeric in E16661 / R16661C5: '2'
## Warning: Coercing text to numeric in E16662 / R16662C5: '2'
## Warning: Coercing text to numeric in E16663 / R16663C5: '2'
## Warning: Coercing text to numeric in E16664 / R16664C5: '1'
## Warning: Coercing text to numeric in E16665 / R16665C5: '1'
## Warning: Coercing text to numeric in E16666 / R16666C5: '1'
## Warning: Coercing text to numeric in E16667 / R16667C5: '1'
## Warning: Coercing text to numeric in E16668 / R16668C5: '1'
## Warning: Coercing text to numeric in E16669 / R16669C5: '1'
## Warning: Coercing text to numeric in E16670 / R16670C5: '1'
## Warning: Coercing text to numeric in E16671 / R16671C5: '1'
## Warning: Coercing text to numeric in E16672 / R16672C5: '1'
## Warning: Coercing text to numeric in E16673 / R16673C5: '1'
## Warning: Coercing text to numeric in E16674 / R16674C5: '1'
## Warning: Coercing text to numeric in E16675 / R16675C5: '1'
## Warning: Coercing text to numeric in E16676 / R16676C5: '1'
## Warning: Coercing text to numeric in E16677 / R16677C5: '1'
## Warning: Coercing text to numeric in E16678 / R16678C5: '1'
## Warning: Coercing text to numeric in E16679 / R16679C5: '1'
## Warning: Coercing text to numeric in E16680 / R16680C5: '1'
## Warning: Coercing text to numeric in E16681 / R16681C5: '1'
## Warning: Coercing text to numeric in E16682 / R16682C5: '1'
## Warning: Coercing text to numeric in E16683 / R16683C5: '1'
## Warning: Coercing text to numeric in E16684 / R16684C5: '1'
## Warning: Coercing text to numeric in E16685 / R16685C5: '1'
## Warning: Coercing text to numeric in E16686 / R16686C5: '1'
## Warning: Coercing text to numeric in E16687 / R16687C5: '1'
## Warning: Coercing text to numeric in E16688 / R16688C5: '2'
## Warning: Coercing text to numeric in E16689 / R16689C5: '2'
## Warning: Coercing text to numeric in E16690 / R16690C5: '2'
## Warning: Coercing text to numeric in E16691 / R16691C5: '2'
## Warning: Coercing text to numeric in E16692 / R16692C5: '2'
## Warning: Coercing text to numeric in E16693 / R16693C5: '2'
## Warning: Coercing text to numeric in E16694 / R16694C5: '2'
## Warning: Coercing text to numeric in E16695 / R16695C5: '2'
## Warning: Coercing text to numeric in E16696 / R16696C5: '2'
## Warning: Coercing text to numeric in E16697 / R16697C5: '2'
## Warning: Coercing text to numeric in E16698 / R16698C5: '2'
## Warning: Coercing text to numeric in E16699 / R16699C5: '2'
## Warning: Coercing text to numeric in E16700 / R16700C5: '2'
## Warning: Coercing text to numeric in E16701 / R16701C5: '2'
## Warning: Coercing text to numeric in E16702 / R16702C5: '2'
## Warning: Coercing text to numeric in E16703 / R16703C5: '2'
## Warning: Coercing text to numeric in E16704 / R16704C5: '2'
## Warning: Coercing text to numeric in E16705 / R16705C5: '2'
## Warning: Coercing text to numeric in E16706 / R16706C5: '2'
## Warning: Coercing text to numeric in E16707 / R16707C5: '2'
## Warning: Coercing text to numeric in E16708 / R16708C5: '2'
## Warning: Coercing text to numeric in E16709 / R16709C5: '2'
## Warning: Coercing text to numeric in E16710 / R16710C5: '2'
## Warning: Coercing text to numeric in E16711 / R16711C5: '2'
## Warning: Coercing text to numeric in E16712 / R16712C5: '2'
## Warning: Coercing text to numeric in E16713 / R16713C5: '2'
## Warning: Coercing text to numeric in E16714 / R16714C5: '2'
## Warning: Coercing text to numeric in E16715 / R16715C5: '2'
## Warning: Coercing text to numeric in E16716 / R16716C5: '2'
## Warning: Coercing text to numeric in E16717 / R16717C5: '2'
## Warning: Coercing text to numeric in E16718 / R16718C5: '2'
## Warning: Coercing text to numeric in E16719 / R16719C5: '2'
## Warning: Coercing text to numeric in E16720 / R16720C5: '2'
## Warning: Coercing text to numeric in E16721 / R16721C5: '2'
## Warning: Coercing text to numeric in E16722 / R16722C5: '2'
## Warning: Coercing text to numeric in E16723 / R16723C5: '2'
## Warning: Coercing text to numeric in E16724 / R16724C5: '1'
## Warning: Coercing text to numeric in E16725 / R16725C5: '1'
## Warning: Coercing text to numeric in E16726 / R16726C5: '1'
## Warning: Coercing text to numeric in E16727 / R16727C5: '1'
## Warning: Coercing text to numeric in E16728 / R16728C5: '1'
## Warning: Coercing text to numeric in E16729 / R16729C5: '1'
## Warning: Coercing text to numeric in E16730 / R16730C5: '2'
## Warning: Coercing text to numeric in E16731 / R16731C5: '2'
## Warning: Coercing text to numeric in E16732 / R16732C5: '2'
## Warning: Coercing text to numeric in E16733 / R16733C5: '2'
## Warning: Coercing text to numeric in E16734 / R16734C5: '2'
## Warning: Coercing text to numeric in E16735 / R16735C5: '2'
## Warning: Coercing text to numeric in E16736 / R16736C5: '1'
## Warning: Coercing text to numeric in E16737 / R16737C5: '1'
## Warning: Coercing text to numeric in E16738 / R16738C5: '1'
## Warning: Coercing text to numeric in E16739 / R16739C5: '1'
## Warning: Coercing text to numeric in E16740 / R16740C5: '1'
## Warning: Coercing text to numeric in E16741 / R16741C5: '1'
## Warning: Coercing text to numeric in E16742 / R16742C5: '2'
## Warning: Coercing text to numeric in E16743 / R16743C5: '2'
## Warning: Coercing text to numeric in E16744 / R16744C5: '2'
## Warning: Coercing text to numeric in E16745 / R16745C5: '2'
## Warning: Coercing text to numeric in E16746 / R16746C5: '2'
## Warning: Coercing text to numeric in E16747 / R16747C5: '2'
## Warning: Coercing text to numeric in E16748 / R16748C5: '1'
## Warning: Coercing text to numeric in E16749 / R16749C5: '1'
## Warning: Coercing text to numeric in E16750 / R16750C5: '1'
## Warning: Coercing text to numeric in E16751 / R16751C5: '1'
## Warning: Coercing text to numeric in E16752 / R16752C5: '1'
## Warning: Coercing text to numeric in E16753 / R16753C5: '1'
## Warning: Coercing text to numeric in E16754 / R16754C5: '2'
## Warning: Coercing text to numeric in E16755 / R16755C5: '2'
## Warning: Coercing text to numeric in E16756 / R16756C5: '2'
## Warning: Coercing text to numeric in E16757 / R16757C5: '2'
## Warning: Coercing text to numeric in E16758 / R16758C5: '2'
## Warning: Coercing text to numeric in E16759 / R16759C5: '2'
## Warning: Coercing text to numeric in E16760 / R16760C5: '2'
## Warning: Coercing text to numeric in E16761 / R16761C5: '2'
## Warning: Coercing text to numeric in E16762 / R16762C5: '2'
## Warning: Coercing text to numeric in E16763 / R16763C5: '2'
## Warning: Coercing text to numeric in E16764 / R16764C5: '2'
## Warning: Coercing text to numeric in E16765 / R16765C5: '2'
## Warning: Coercing text to numeric in E16766 / R16766C5: '2'
## Warning: Coercing text to numeric in E16767 / R16767C5: '2'
## Warning: Coercing text to numeric in E16768 / R16768C5: '2'
## Warning: Coercing text to numeric in E16769 / R16769C5: '2'
## Warning: Coercing text to numeric in E16770 / R16770C5: '2'
## Warning: Coercing text to numeric in E16771 / R16771C5: '2'
## Warning: Coercing text to numeric in E16772 / R16772C5: '1'
## Warning: Coercing text to numeric in E16773 / R16773C5: '1'
## Warning: Coercing text to numeric in E16774 / R16774C5: '1'
## Warning: Coercing text to numeric in E16775 / R16775C5: '1'
## Warning: Coercing text to numeric in E16776 / R16776C5: '1'
## Warning: Coercing text to numeric in E16777 / R16777C5: '1'
## Warning: Coercing text to numeric in E16778 / R16778C5: '1'
## Warning: Coercing text to numeric in E16779 / R16779C5: '1'
## Warning: Coercing text to numeric in E16780 / R16780C5: '1'
## Warning: Coercing text to numeric in E16781 / R16781C5: '1'
## Warning: Coercing text to numeric in E16782 / R16782C5: '1'
## Warning: Coercing text to numeric in E16783 / R16783C5: '1'
## Warning: Coercing text to numeric in E16784 / R16784C5: '1'
## Warning: Coercing text to numeric in E16785 / R16785C5: '1'
## Warning: Coercing text to numeric in E16786 / R16786C5: '1'
## Warning: Coercing text to numeric in E16787 / R16787C5: '1'
## Warning: Coercing text to numeric in E16788 / R16788C5: '1'
## Warning: Coercing text to numeric in E16789 / R16789C5: '1'
## Warning: Coercing text to numeric in E16790 / R16790C5: '2'
## Warning: Coercing text to numeric in E16791 / R16791C5: '2'
## Warning: Coercing text to numeric in E16792 / R16792C5: '2'
## Warning: Coercing text to numeric in E16793 / R16793C5: '2'
## Warning: Coercing text to numeric in E16794 / R16794C5: '2'
## Warning: Coercing text to numeric in E16795 / R16795C5: '2'
## Warning: Coercing text to numeric in E16796 / R16796C5: '1'
## Warning: Coercing text to numeric in E16797 / R16797C5: '1'
## Warning: Coercing text to numeric in E16798 / R16798C5: '1'
## Warning: Coercing text to numeric in E16799 / R16799C5: '1'
## Warning: Coercing text to numeric in E16800 / R16800C5: '1'
## Warning: Coercing text to numeric in E16801 / R16801C5: '1'
## Warning: Coercing text to numeric in E16802 / R16802C5: '1'
## Warning: Coercing text to numeric in E16803 / R16803C5: '1'
## Warning: Coercing text to numeric in E16804 / R16804C5: '1'
## Warning: Coercing text to numeric in E16805 / R16805C5: '1'
## Warning: Coercing text to numeric in E16806 / R16806C5: '1'
## Warning: Coercing text to numeric in E16807 / R16807C5: '1'
## Warning: Coercing text to numeric in E16808 / R16808C5: '1'
## Warning: Coercing text to numeric in E16809 / R16809C5: '1'
## Warning: Coercing text to numeric in E16810 / R16810C5: '1'
## Warning: Coercing text to numeric in E16811 / R16811C5: '1'
## Warning: Coercing text to numeric in E16812 / R16812C5: '1'
## Warning: Coercing text to numeric in E16813 / R16813C5: '1'
## Warning: Coercing text to numeric in E16814 / R16814C5: '1'
## Warning: Coercing text to numeric in E16815 / R16815C5: '1'
## Warning: Coercing text to numeric in E16816 / R16816C5: '1'
## Warning: Coercing text to numeric in E16817 / R16817C5: '1'
## Warning: Coercing text to numeric in E16818 / R16818C5: '1'
## Warning: Coercing text to numeric in E16819 / R16819C5: '1'
## Warning: Coercing text to numeric in E16820 / R16820C5: '2'
## Warning: Coercing text to numeric in E16821 / R16821C5: '2'
## Warning: Coercing text to numeric in E16822 / R16822C5: '2'
## Warning: Coercing text to numeric in E16823 / R16823C5: '2'
## Warning: Coercing text to numeric in E16824 / R16824C5: '2'
## Warning: Coercing text to numeric in E16825 / R16825C5: '2'
## Warning: Coercing text to numeric in E16826 / R16826C5: '2'
## Warning: Coercing text to numeric in E16827 / R16827C5: '2'
## Warning: Coercing text to numeric in E16828 / R16828C5: '2'
## Warning: Coercing text to numeric in E16829 / R16829C5: '2'
## Warning: Coercing text to numeric in E16830 / R16830C5: '2'
## Warning: Coercing text to numeric in E16831 / R16831C5: '2'
## Warning: Coercing text to numeric in E16832 / R16832C5: '1'
## Warning: Coercing text to numeric in E16833 / R16833C5: '1'
## Warning: Coercing text to numeric in E16834 / R16834C5: '1'
## Warning: Coercing text to numeric in E16835 / R16835C5: '1'
## Warning: Coercing text to numeric in E16836 / R16836C5: '1'
## Warning: Coercing text to numeric in E16837 / R16837C5: '1'
## Warning: Coercing text to numeric in E16838 / R16838C5: '1'
## Warning: Coercing text to numeric in E16839 / R16839C5: '1'
## Warning: Coercing text to numeric in E16840 / R16840C5: '1'
## Warning: Coercing text to numeric in E16841 / R16841C5: '1'
## Warning: Coercing text to numeric in E16842 / R16842C5: '1'
## Warning: Coercing text to numeric in E16843 / R16843C5: '1'
## Warning: Coercing text to numeric in E16844 / R16844C5: '2'
## Warning: Coercing text to numeric in E16845 / R16845C5: '2'
## Warning: Coercing text to numeric in E16846 / R16846C5: '2'
## Warning: Coercing text to numeric in E16847 / R16847C5: '2'
## Warning: Coercing text to numeric in E16848 / R16848C5: '2'
## Warning: Coercing text to numeric in E16849 / R16849C5: '2'
## Warning: Coercing text to numeric in E16850 / R16850C5: '1'
## Warning: Coercing text to numeric in E16851 / R16851C5: '1'
## Warning: Coercing text to numeric in E16852 / R16852C5: '1'
## Warning: Coercing text to numeric in E16853 / R16853C5: '1'
## Warning: Coercing text to numeric in E16854 / R16854C5: '1'
## Warning: Coercing text to numeric in E16855 / R16855C5: '1'
## Warning: Coercing text to numeric in E16856 / R16856C5: '1'
## Warning: Coercing text to numeric in E16857 / R16857C5: '1'
## Warning: Coercing text to numeric in E16858 / R16858C5: '1'
## Warning: Coercing text to numeric in E16859 / R16859C5: '1'
## Warning: Coercing text to numeric in E16860 / R16860C5: '1'
## Warning: Coercing text to numeric in E16861 / R16861C5: '1'
## Warning: Coercing text to numeric in E16862 / R16862C5: '1'
## Warning: Coercing text to numeric in E16863 / R16863C5: '1'
## Warning: Coercing text to numeric in E16864 / R16864C5: '1'
## Warning: Coercing text to numeric in E16865 / R16865C5: '1'
## Warning: Coercing text to numeric in E16866 / R16866C5: '1'
## Warning: Coercing text to numeric in E16867 / R16867C5: '1'
## Warning: Coercing text to numeric in E16868 / R16868C5: '1'
## Warning: Coercing text to numeric in E16869 / R16869C5: '1'
## Warning: Coercing text to numeric in E16870 / R16870C5: '1'
## Warning: Coercing text to numeric in E16871 / R16871C5: '1'
## Warning: Coercing text to numeric in E16872 / R16872C5: '1'
## Warning: Coercing text to numeric in E16873 / R16873C5: '1'
## Warning: Coercing text to numeric in E16874 / R16874C5: '2'
## Warning: Coercing text to numeric in E16875 / R16875C5: '2'
## Warning: Coercing text to numeric in E16876 / R16876C5: '2'
## Warning: Coercing text to numeric in E16877 / R16877C5: '2'
## Warning: Coercing text to numeric in E16878 / R16878C5: '2'
## Warning: Coercing text to numeric in E16879 / R16879C5: '2'
## Warning: Coercing text to numeric in E16880 / R16880C5: '1'
## Warning: Coercing text to numeric in E16881 / R16881C5: '1'
## Warning: Coercing text to numeric in E16882 / R16882C5: '1'
## Warning: Coercing text to numeric in E16883 / R16883C5: '1'
## Warning: Coercing text to numeric in E16884 / R16884C5: '1'
## Warning: Coercing text to numeric in E16885 / R16885C5: '1'
## Warning: Coercing text to numeric in E16886 / R16886C5: '2'
## Warning: Coercing text to numeric in E16887 / R16887C5: '2'
## Warning: Coercing text to numeric in E16888 / R16888C5: '2'
## Warning: Coercing text to numeric in E16889 / R16889C5: '2'
## Warning: Coercing text to numeric in E16890 / R16890C5: '2'
## Warning: Coercing text to numeric in E16891 / R16891C5: '2'
## Warning: Coercing text to numeric in E16892 / R16892C5: '2'
## Warning: Coercing text to numeric in E16893 / R16893C5: '2'
## Warning: Coercing text to numeric in E16894 / R16894C5: '2'
## Warning: Coercing text to numeric in E16895 / R16895C5: '2'
## Warning: Coercing text to numeric in E16896 / R16896C5: '2'
## Warning: Coercing text to numeric in E16897 / R16897C5: '2'
## Warning: Coercing text to numeric in E16898 / R16898C5: '1'
## Warning: Coercing text to numeric in E16899 / R16899C5: '1'
## Warning: Coercing text to numeric in E16900 / R16900C5: '1'
## Warning: Coercing text to numeric in E16901 / R16901C5: '1'
## Warning: Coercing text to numeric in E16902 / R16902C5: '1'
## Warning: Coercing text to numeric in E16903 / R16903C5: '1'
## Warning: Coercing text to numeric in E16904 / R16904C5: '1'
## Warning: Coercing text to numeric in E16905 / R16905C5: '1'
## Warning: Coercing text to numeric in E16906 / R16906C5: '1'
## Warning: Coercing text to numeric in E16907 / R16907C5: '1'
## Warning: Coercing text to numeric in E16908 / R16908C5: '1'
## Warning: Coercing text to numeric in E16909 / R16909C5: '1'
## Warning: Coercing text to numeric in E16910 / R16910C5: '2'
## Warning: Coercing text to numeric in E16911 / R16911C5: '2'
## Warning: Coercing text to numeric in E16912 / R16912C5: '2'
## Warning: Coercing text to numeric in E16913 / R16913C5: '2'
## Warning: Coercing text to numeric in E16914 / R16914C5: '2'
## Warning: Coercing text to numeric in E16915 / R16915C5: '2'
## Warning: Coercing text to numeric in E16916 / R16916C5: '2'
## Warning: Coercing text to numeric in E16917 / R16917C5: '2'
## Warning: Coercing text to numeric in E16918 / R16918C5: '2'
## Warning: Coercing text to numeric in E16919 / R16919C5: '2'
## Warning: Coercing text to numeric in E16920 / R16920C5: '2'
## Warning: Coercing text to numeric in E16921 / R16921C5: '2'
## Warning: Coercing text to numeric in E16922 / R16922C5: '2'
## Warning: Coercing text to numeric in E16923 / R16923C5: '2'
## Warning: Coercing text to numeric in E16924 / R16924C5: '2'
## Warning: Coercing text to numeric in E16925 / R16925C5: '2'
## Warning: Coercing text to numeric in E16926 / R16926C5: '2'
## Warning: Coercing text to numeric in E16927 / R16927C5: '2'
## Warning: Coercing text to numeric in E16928 / R16928C5: '2'
## Warning: Coercing text to numeric in E16929 / R16929C5: '2'
## Warning: Coercing text to numeric in E16930 / R16930C5: '2'
## Warning: Coercing text to numeric in E16931 / R16931C5: '2'
## Warning: Coercing text to numeric in E16932 / R16932C5: '2'
## Warning: Coercing text to numeric in E16933 / R16933C5: '2'
## Warning: Coercing text to numeric in E16934 / R16934C5: '2'
## Warning: Coercing text to numeric in E16935 / R16935C5: '2'
## Warning: Coercing text to numeric in E16936 / R16936C5: '2'
## Warning: Coercing text to numeric in E16937 / R16937C5: '2'
## Warning: Coercing text to numeric in E16938 / R16938C5: '2'
## Warning: Coercing text to numeric in E16939 / R16939C5: '2'
## Warning: Coercing text to numeric in E16940 / R16940C5: '2'
## Warning: Coercing text to numeric in E16941 / R16941C5: '2'
## Warning: Coercing text to numeric in E16942 / R16942C5: '2'
## Warning: Coercing text to numeric in E16943 / R16943C5: '2'
## Warning: Coercing text to numeric in E16944 / R16944C5: '2'
## Warning: Coercing text to numeric in E16945 / R16945C5: '2'
df_contrain = final_data_steps %>% filter(session < 5)
df_contest = final_data_steps %>% filter(session > 4)
df_contrain$subject = factor(df_contrain$subject)
df_contrain$session = factor(df_contrain$session)
df_contrain$stepNumber = factor(df_contrain$stepNumber, ordered = TRUE, levels=c('1' ,'2', '3', '4', '5', '6'))
#Concatenation models
m.contrainRT = lmer(feedback.RT ~ stepNumber * session + (session|subject), data = df_contrain, REML = FALSE)
Anova(m.contrainRT)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: feedback.RT
## Chisq Df Pr(>Chisq)
## stepNumber 9212.864 5 < 2.2e-16 ***
## session 46.581 3 4.267e-10 ***
## stepNumber:session 455.190 15 < 2.2e-16 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.contrainRT, ddf="Satterthwaite")
## Warning in summary.merMod(m.contrainRT, ddf = "Satterthwaite"): additional
## arguments ignored
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: feedback.RT ~ stepNumber * session + (session | subject)
## Data: df_contrain
##
## AIC BIC logLik deviance df.resid
## 149279.3 149535.7 -74604.6 149209.3 11197
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -5.8883 -0.4314 -0.0857 0.2808 17.0968
##
## Random effects:
## Groups Name Variance Std.Dev. Corr
## subject (Intercept) 21878 147.9
## session2 6256 79.1 -0.18
## session3 12321 111.0 -0.38 0.86
## session4 16609 128.9 -0.44 0.80 0.98
## Residual 33930 184.2
## Number of obs: 11232, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 538.765 42.867 12.568
## stepNumber.L -378.787 9.142 -41.435
## stepNumber.Q 305.315 9.142 33.398
## stepNumber.C -225.539 9.142 -24.671
## stepNumber^4 93.453 9.142 10.223
## stepNumber^5 -58.657 9.142 -6.416
## session2 -150.252 23.393 -6.423
## session3 -216.836 32.448 -6.682
## session4 -239.728 37.557 -6.383
## stepNumber.L:session2 94.899 12.322 7.701
## stepNumber.Q:session2 -21.769 12.322 -1.767
## stepNumber.C:session2 52.665 12.322 4.274
## stepNumber^4:session2 -23.047 12.322 -1.870
## stepNumber^5:session2 17.875 12.322 1.451
## stepNumber.L:session3 169.729 12.373 13.717
## stepNumber.Q:session3 -76.533 12.373 -6.185
## stepNumber.C:session3 99.559 12.373 8.046
## stepNumber^4:session3 -42.026 12.373 -3.396
## stepNumber^5:session3 29.812 12.373 2.409
## stepNumber.L:session4 182.307 12.414 14.685
## stepNumber.Q:session4 -75.305 12.414 -6.066
## stepNumber.C:session4 112.913 12.414 9.096
## stepNumber^4:session4 -44.594 12.414 -3.592
## stepNumber^5:session4 23.152 12.414 1.865
##
## Correlation matrix not shown by default, as p = 24 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
#Posthocs testing blocks
emm.mcontrainRT <- emmeans(m.contrainRT, pairwise ~ stepNumber|session)
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'pbkrtest.limit = 11232' (or larger)
## [or, globally, 'set emm_options(pbkrtest.limit = 11232)' or larger];
## but be warned that this may result in large computation time and memory use.
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'lmerTest.limit = 11232' (or larger)
## [or, globally, 'set emm_options(lmerTest.limit = 11232)' or larger];
## but be warned that this may result in large computation time and memory use.
print(emm.mcontrainRT)
## $emmeans
## session = 1:
## stepNumber emmean SE df asymp.LCL asymp.UCL
## 1 1037 43.7 Inf 952 1123
## 2 452 43.7 Inf 367 538
## 3 456 43.7 Inf 370 541
## 4 426 43.7 Inf 340 511
## 5 453 43.7 Inf 367 538
## 6 409 43.7 Inf 323 494
##
## session = 2:
## stepNumber emmean SE df asymp.LCL asymp.UCL
## 1 793 45.4 Inf 704 882
## 2 316 45.4 Inf 227 405
## 3 299 45.4 Inf 210 388
## 4 283 45.4 Inf 194 372
## 5 319 45.4 Inf 230 408
## 6 320 45.4 Inf 231 409
##
## session = 3:
## stepNumber emmean SE df asymp.LCL asymp.UCL
## 1 630 43.2 Inf 545 715
## 2 268 43.2 Inf 183 353
## 3 247 43.2 Inf 162 332
## 4 236 43.2 Inf 151 321
## 5 268 43.2 Inf 183 352
## 6 283 43.2 Inf 198 368
##
## session = 4:
## stepNumber emmean SE df asymp.LCL asymp.UCL
## 1 595 43.2 Inf 511 680
## 2 247 43.2 Inf 162 331
## 3 229 43.2 Inf 145 314
## 4 205 43.2 Inf 120 290
## 5 246 43.2 Inf 161 330
## 6 272 43.2 Inf 187 357
##
## Degrees-of-freedom method: asymptotic
## Confidence level used: 0.95
##
## $contrasts
## session = 1:
## contrast estimate SE df z.ratio p.value
## stepNumber1 - stepNumber2 584.966 12.9 Inf 45.247 <.0001
## stepNumber1 - stepNumber3 581.288 12.9 Inf 44.962 <.0001
## stepNumber1 - stepNumber4 611.251 12.9 Inf 47.280 <.0001
## stepNumber1 - stepNumber5 584.308 12.9 Inf 45.196 <.0001
## stepNumber1 - stepNumber6 628.234 12.9 Inf 48.594 <.0001
## stepNumber2 - stepNumber3 -3.677 12.9 Inf -0.284 0.9998
## stepNumber2 - stepNumber4 26.286 12.9 Inf 2.033 0.3233
## stepNumber2 - stepNumber5 -0.658 12.9 Inf -0.051 1.0000
## stepNumber2 - stepNumber6 43.269 12.9 Inf 3.347 0.0106
## stepNumber3 - stepNumber4 29.963 12.9 Inf 2.318 0.1868
## stepNumber3 - stepNumber5 3.020 12.9 Inf 0.234 0.9999
## stepNumber3 - stepNumber6 46.946 12.9 Inf 3.631 0.0038
## stepNumber4 - stepNumber5 -26.943 12.9 Inf -2.084 0.2956
## stepNumber4 - stepNumber6 16.983 12.9 Inf 1.314 0.7776
## stepNumber5 - stepNumber6 43.926 12.9 Inf 3.398 0.0089
##
## session = 2:
## contrast estimate SE df z.ratio p.value
## stepNumber1 - stepNumber2 476.747 11.7 Inf 40.800 <.0001
## stepNumber1 - stepNumber3 493.702 11.7 Inf 42.251 <.0001
## stepNumber1 - stepNumber4 509.863 11.7 Inf 43.634 <.0001
## stepNumber1 - stepNumber5 474.250 11.7 Inf 40.586 <.0001
## stepNumber1 - stepNumber6 473.302 11.7 Inf 40.505 <.0001
## stepNumber2 - stepNumber3 16.956 11.7 Inf 1.451 0.6955
## stepNumber2 - stepNumber4 33.117 11.7 Inf 2.834 0.0522
## stepNumber2 - stepNumber5 -2.497 11.7 Inf -0.214 0.9999
## stepNumber2 - stepNumber6 -3.445 11.7 Inf -0.295 0.9997
## stepNumber3 - stepNumber4 16.161 11.7 Inf 1.383 0.7373
## stepNumber3 - stepNumber5 -19.453 11.7 Inf -1.665 0.5553
## stepNumber3 - stepNumber6 -20.400 11.7 Inf -1.746 0.5012
## stepNumber4 - stepNumber5 -35.614 11.7 Inf -3.048 0.0279
## stepNumber4 - stepNumber6 -36.561 11.7 Inf -3.129 0.0217
## stepNumber5 - stepNumber6 -0.948 11.7 Inf -0.081 1.0000
##
## session = 3:
## contrast estimate SE df z.ratio p.value
## stepNumber1 - stepNumber2 362.205 11.8 Inf 30.716 <.0001
## stepNumber1 - stepNumber3 383.045 11.8 Inf 32.483 <.0001
## stepNumber1 - stepNumber4 394.242 11.8 Inf 33.432 <.0001
## stepNumber1 - stepNumber5 362.498 11.8 Inf 30.740 <.0001
## stepNumber1 - stepNumber6 347.406 11.8 Inf 29.461 <.0001
## stepNumber2 - stepNumber3 20.840 11.8 Inf 1.767 0.4871
## stepNumber2 - stepNumber4 32.037 11.8 Inf 2.717 0.0719
## stepNumber2 - stepNumber5 0.293 11.8 Inf 0.025 1.0000
## stepNumber2 - stepNumber6 -14.799 11.8 Inf -1.255 0.8094
## stepNumber3 - stepNumber4 11.197 11.8 Inf 0.950 0.9335
## stepNumber3 - stepNumber5 -20.547 11.8 Inf -1.742 0.5035
## stepNumber3 - stepNumber6 -35.639 11.8 Inf -3.022 0.0302
## stepNumber4 - stepNumber5 -31.744 11.8 Inf -2.692 0.0768
## stepNumber4 - stepNumber6 -46.836 11.8 Inf -3.972 0.0010
## stepNumber5 - stepNumber6 -15.092 11.8 Inf -1.280 0.7962
##
## session = 4:
## contrast estimate SE df z.ratio p.value
## stepNumber1 - stepNumber2 348.634 11.9 Inf 29.352 <.0001
## stepNumber1 - stepNumber3 365.990 11.9 Inf 30.813 <.0001
## stepNumber1 - stepNumber4 390.532 11.9 Inf 32.879 <.0001
## stepNumber1 - stepNumber5 349.647 11.9 Inf 29.437 <.0001
## stepNumber1 - stepNumber6 323.258 11.9 Inf 27.216 <.0001
## stepNumber2 - stepNumber3 17.355 11.9 Inf 1.461 0.6891
## stepNumber2 - stepNumber4 41.898 11.9 Inf 3.527 0.0056
## stepNumber2 - stepNumber5 1.012 11.9 Inf 0.085 1.0000
## stepNumber2 - stepNumber6 -25.376 11.9 Inf -2.136 0.2684
## stepNumber3 - stepNumber4 24.543 11.9 Inf 2.066 0.3051
## stepNumber3 - stepNumber5 -16.343 11.9 Inf -1.376 0.7416
## stepNumber3 - stepNumber6 -42.732 11.9 Inf -3.598 0.0043
## stepNumber4 - stepNumber5 -40.886 11.9 Inf -3.442 0.0076
## stepNumber4 - stepNumber6 -67.274 11.9 Inf -5.664 <.0001
## stepNumber5 - stepNumber6 -26.389 11.9 Inf -2.222 0.2276
##
## Degrees-of-freedom method: asymptotic
## P value adjustment: tukey method for comparing a family of 6 estimates
#Effects
ae.m.contrainRT <- allEffects(m.contrainRT)
ae.m.contrainRT.df <- as.data.frame(ae.m.contrainRT[[1]])
#Proper CIs
#change conf interval to 83%, match p = .05
ae.m.contrainRT.df$l83 <- ae.m.contrainRT.df$fit - 1.3722 * ae.m.blktestRT.df$se
ae.m.contrainRT.df$u83 <- ae.m.contrainRT.df$fit + 1.3722 * ae.m.blktestRT.df$se
# Effects Plot
plot.contrain <- ggplot(ae.m.contrainRT.df, aes(x=stepNumber, y=fit, ymin=l83, ymax=u83))+
geom_point(aes(color = session), size=3) +
geom_path(aes(x=stepNumber, y=fit, group=session, colour=session)) +
geom_ribbon(aes(ymin=l83, ymax=u83, group=session, fill=session), alpha=0.2) +
ylab("RT (ms)")+
xlab("Step Position")+
ggtitle("Learning Phase Concatenation")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))
print(plot.contrain)
#dfload = final_data_steps
#df_contrain = final_data_steps %>% filter(session < 5)
#df_contest = final_data_steps %>% filter(session > 4)
df_contest$subject = factor(df_contest$subject)
df_contest$session = factor(df_contest$session)
df_contest$stepNumber = factor(df_contest$stepNumber, ordered = TRUE, levels=c('1' ,'2', '3', '4', '5', '6'))
#Concatenation models
m.contestRT = lmer(feedback.RT ~ stepNumber * session + (session|subject), data = df_contest, REML = FALSE)
Anova(m.contestRT)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: feedback.RT
## Chisq Df Pr(>Chisq)
## stepNumber 3479.357 5 < 2.2e-16 ***
## session 16.999 1 3.740e-05 ***
## stepNumber:session 65.475 5 8.932e-13 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.contestRT, ddf="Satterthwaite")
## Warning in summary.merMod(m.contestRT, ddf = "Satterthwaite"): additional
## arguments ignored
## Linear mixed model fit by maximum likelihood ['lmerMod']
## Formula: feedback.RT ~ stepNumber * session + (session | subject)
## Data: df_contest
##
## AIC BIC logLik deviance df.resid
## 74445.3 74551.7 -37206.6 74413.3 5696
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -4.5417 -0.4319 -0.0959 0.2886 16.7666
##
## Random effects:
## Groups Name Variance Std.Dev. Corr
## subject (Intercept) 19368 139.17
## session6 5086 71.32 -0.22
## Residual 26129 161.64
## Number of obs: 5712, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 267.416 40.287 6.638
## stepNumber.L -170.819 7.302 -23.393
## stepNumber.Q 185.000 7.302 25.334
## stepNumber.C -96.707 7.302 -13.243
## stepNumber^4 45.722 7.302 6.261
## stepNumber^5 -28.136 7.302 -3.853
## session6 86.737 21.038 4.123
## stepNumber.L:session6 -50.884 10.482 -4.854
## stepNumber.Q:session6 16.656 10.482 1.589
## stepNumber.C:session6 -58.640 10.482 -5.594
## stepNumber^4:session6 29.653 10.482 2.829
## stepNumber^5:session6 3.135 10.482 0.299
##
## Correlation of Fixed Effects:
## (Intr) stpN.L stpN.Q stpN.C stpN^4 stpN^5 sessn6 sN.L:6 sN.Q:6
## stepNumbr.L 0.000
## stepNumbr.Q 0.000 0.000
## stepNumbr.C 0.000 0.000 0.000
## stepNumbr^4 0.000 0.000 0.000 0.000
## stepNumbr^5 0.000 0.000 0.000 0.000 0.000
## session6 -0.221 0.000 0.000 0.000 0.000 0.000
## stpNmbr.L:6 0.000 -0.697 0.000 0.000 0.000 0.000 0.000
## stpNmbr.Q:6 0.000 0.000 -0.697 0.000 0.000 0.000 0.000 0.000
## stpNmbr.C:6 0.000 0.000 0.000 -0.697 0.000 0.000 0.000 0.000 0.000
## stpNmbr^4:6 0.000 0.000 0.000 0.000 -0.697 0.000 0.000 0.000 0.000
## stpNmbr^5:6 0.000 0.000 0.000 0.000 0.000 -0.697 0.000 0.000 0.000
## sN.C:6 sN^4:6
## stepNumbr.L
## stepNumbr.Q
## stepNumbr.C
## stepNumbr^4
## stepNumbr^5
## session6
## stpNmbr.L:6
## stpNmbr.Q:6
## stpNmbr.C:6
## stpNmbr^4:6 0.000
## stpNmbr^5:6 0.000 0.000
#Posthocs testing blocks
emm.mcontestRT <- emmeans(m.contestRT, pairwise ~ stepNumber|session)
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'pbkrtest.limit = 5712' (or larger)
## [or, globally, 'set emm_options(pbkrtest.limit = 5712)' or larger];
## but be warned that this may result in large computation time and memory use.
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'lmerTest.limit = 5712' (or larger)
## [or, globally, 'set emm_options(lmerTest.limit = 5712)' or larger];
## but be warned that this may result in large computation time and memory use.
emm.mcontestRT2 <- emmeans(m.contestRT, pairwise ~ session|stepNumber)
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'pbkrtest.limit = 5712' (or larger)
## [or, globally, 'set emm_options(pbkrtest.limit = 5712)' or larger];
## but be warned that this may result in large computation time and memory use.
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'lmerTest.limit = 5712' (or larger)
## [or, globally, 'set emm_options(lmerTest.limit = 5712)' or larger];
## but be warned that this may result in large computation time and memory use.
print(emm.mcontestRT)
## $emmeans
## session = 5:
## stepNumber emmean SE df asymp.LCL asymp.UCL
## 1 517 40.8 Inf 437 597
## 2 223 40.8 Inf 143 303
## 3 213 40.8 Inf 133 293
## 4 195 40.8 Inf 115 275
## 5 219 40.8 Inf 139 299
## 6 237 40.8 Inf 157 317
##
## session = 6:
## stepNumber emmean SE df asymp.LCL asymp.UCL
## 1 670 41.7 Inf 589 752
## 2 280 41.7 Inf 198 362
## 3 291 41.7 Inf 209 372
## 4 299 41.7 Inf 217 380
## 5 299 41.7 Inf 217 381
## 6 286 41.7 Inf 205 368
##
## Degrees-of-freedom method: asymptotic
## Confidence level used: 0.95
##
## $contrasts
## session = 5:
## contrast estimate SE df z.ratio p.value
## stepNumber1 - stepNumber2 293.639 10.3 Inf 28.434 <.0001
## stepNumber1 - stepNumber3 303.614 10.3 Inf 29.400 <.0001
## stepNumber1 - stepNumber4 322.231 10.3 Inf 31.203 <.0001
## stepNumber1 - stepNumber5 297.502 10.3 Inf 28.808 <.0001
## stepNumber1 - stepNumber6 279.794 10.3 Inf 27.093 <.0001
## stepNumber2 - stepNumber3 9.976 10.3 Inf 0.966 0.9287
## stepNumber2 - stepNumber4 28.592 10.3 Inf 2.769 0.0626
## stepNumber2 - stepNumber5 3.863 10.3 Inf 0.374 0.9991
## stepNumber2 - stepNumber6 -13.845 10.3 Inf -1.341 0.7623
## stepNumber3 - stepNumber4 18.616 10.3 Inf 1.803 0.4639
## stepNumber3 - stepNumber5 -6.112 10.3 Inf -0.592 0.9916
## stepNumber3 - stepNumber6 -23.820 10.3 Inf -2.307 0.1912
## stepNumber4 - stepNumber5 -24.729 10.3 Inf -2.395 0.1580
## stepNumber4 - stepNumber6 -42.437 10.3 Inf -4.109 0.0006
## stepNumber5 - stepNumber6 -17.708 10.3 Inf -1.715 0.5219
##
## session = 6:
## contrast estimate SE df z.ratio p.value
## stepNumber1 - stepNumber2 390.385 10.6 Inf 36.706 <.0001
## stepNumber1 - stepNumber3 379.807 10.6 Inf 35.712 <.0001
## stepNumber1 - stepNumber4 371.671 10.6 Inf 34.947 <.0001
## stepNumber1 - stepNumber5 371.524 10.6 Inf 34.933 <.0001
## stepNumber1 - stepNumber6 383.924 10.6 Inf 36.099 <.0001
## stepNumber2 - stepNumber3 -10.578 10.6 Inf -0.995 0.9198
## stepNumber2 - stepNumber4 -18.714 10.6 Inf -1.760 0.4921
## stepNumber2 - stepNumber5 -18.861 10.6 Inf -1.773 0.4830
## stepNumber2 - stepNumber6 -6.461 10.6 Inf -0.608 0.9905
## stepNumber3 - stepNumber4 -8.136 10.6 Inf -0.765 0.9733
## stepNumber3 - stepNumber5 -8.284 10.6 Inf -0.779 0.9711
## stepNumber3 - stepNumber6 4.117 10.6 Inf 0.387 0.9989
## stepNumber4 - stepNumber5 -0.147 10.6 Inf -0.014 1.0000
## stepNumber4 - stepNumber6 12.253 10.6 Inf 1.152 0.8593
## stepNumber5 - stepNumber6 12.400 10.6 Inf 1.166 0.8531
##
## Degrees-of-freedom method: asymptotic
## P value adjustment: tukey method for comparing a family of 6 estimates
print(emm.mcontestRT2)
## $emmeans
## stepNumber = 1:
## session emmean SE df asymp.LCL asymp.UCL
## 5 517 40.8 Inf 437 597
## 6 670 41.7 Inf 589 752
##
## stepNumber = 2:
## session emmean SE df asymp.LCL asymp.UCL
## 5 223 40.8 Inf 143 303
## 6 280 41.7 Inf 198 362
##
## stepNumber = 3:
## session emmean SE df asymp.LCL asymp.UCL
## 5 213 40.8 Inf 133 293
## 6 291 41.7 Inf 209 372
##
## stepNumber = 4:
## session emmean SE df asymp.LCL asymp.UCL
## 5 195 40.8 Inf 115 275
## 6 299 41.7 Inf 217 380
##
## stepNumber = 5:
## session emmean SE df asymp.LCL asymp.UCL
## 5 219 40.8 Inf 139 299
## 6 299 41.7 Inf 217 381
##
## stepNumber = 6:
## session emmean SE df asymp.LCL asymp.UCL
## 5 237 40.8 Inf 157 317
## 6 286 41.7 Inf 205 368
##
## Degrees-of-freedom method: asymptotic
## Confidence level used: 0.95
##
## $contrasts
## stepNumber = 1:
## contrast estimate SE df z.ratio p.value
## session5 - session6 -153.5 23.1 Inf -6.641 <.0001
##
## stepNumber = 2:
## contrast estimate SE df z.ratio p.value
## session5 - session6 -56.7 23.1 Inf -2.455 0.0141
##
## stepNumber = 3:
## contrast estimate SE df z.ratio p.value
## session5 - session6 -77.3 23.1 Inf -3.345 0.0008
##
## stepNumber = 4:
## contrast estimate SE df z.ratio p.value
## session5 - session6 -104.1 23.1 Inf -4.502 <.0001
##
## stepNumber = 5:
## contrast estimate SE df z.ratio p.value
## session5 - session6 -79.5 23.1 Inf -3.439 0.0006
##
## stepNumber = 6:
## contrast estimate SE df z.ratio p.value
## session5 - session6 -49.4 23.1 Inf -2.136 0.0327
##
## Degrees-of-freedom method: asymptotic
#Effects
ae.m.contestRT <- allEffects(m.contestRT)
ae.m.contestRT.df <- as.data.frame(ae.m.contestRT[[1]])
#Proper CIs
#change conf interval to 83%, match p = .05
ae.m.contestRT.df$l83 <- ae.m.contestRT.df$fit - 1.3722 * ae.m.blktestRT.df$se
ae.m.contestRT.df$u83 <- ae.m.contestRT.df$fit + 1.3722 * ae.m.blktestRT.df$se
# Effects Plot
plot.contest <- ggplot(ae.m.contestRT.df, aes(x=stepNumber, y=fit, ymin=l83, ymax=u83))+
geom_point(aes(color = session), size=3) +
geom_path(aes(x=stepNumber, y=fit, group=session, colour=session)) +
geom_ribbon(aes(ymin=l83, ymax=u83, group=session, fill=session), alpha=0.2) +
ylab("RT (ms)")+
xlab("Step position")+
ggtitle("Learning Phase Concatenation")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))
print(plot.contest)
setwd("C:/Users/cutba/OneDrive - University of Twente/1_Conferences/2024_Conferences/Mobi_June24/Analysis/EEGDFs")
#dfeeg = read_excel("eeg_data_theta_RT.xlsx")
dfeeg <- read_excel("eeg_data_theta_RT.xlsx",
col_types = c("numeric", "numeric", "numeric",
"numeric", "numeric", "numeric",
"numeric", "numeric"))
#factors
dfeeg$subject <- factor(dfeeg$subject)
dfeeg$block <- factor(dfeeg$block)
dfeeg$step <- factor(dfeeg$step)
#All Theta models
m.c3.theta <- lmer(C3~ block * step + (1|subject), data = dfeeg)
Anova(m.c3.theta)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: C3
## Chisq Df Pr(>Chisq)
## block 13.014 5 0.02325 *
## step 115.645 5 < 2e-16 ***
## block:step 33.672 25 0.11511
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.c3.theta)
## Linear mixed model fit by REML ['lmerMod']
## Formula: C3 ~ block * step + (1 | subject)
## Data: dfeeg
##
## REML criterion at convergence: 280175.1
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -0.9460 -0.3484 -0.1904 0.0489 29.3804
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 31729 178.1
## Residual 906226 952.0
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 182.64419 69.84453 2.615
## block2 3.75877 63.69746 0.059
## block3 34.21949 63.96768 0.535
## block4 32.98138 64.18346 0.514
## block5 26.25917 63.91400 0.411
## block6 7.11400 64.78553 0.110
## step2 183.28114 66.81443 2.743
## step3 153.09706 66.81443 2.291
## step4 248.49475 66.81443 3.719
## step5 294.29184 66.81443 4.405
## step6 239.57046 66.81443 3.586
## block2:step2 14.83826 90.06083 0.165
## block3:step2 -22.24199 90.43345 -0.246
## block4:step2 -26.01382 90.73180 -0.287
## block5:step2 -23.90392 90.34959 -0.265
## block6:step2 -44.78597 91.58179 -0.489
## block2:step3 74.70876 90.06083 0.830
## block3:step3 131.07554 90.43345 1.449
## block4:step3 -3.03056 90.73180 -0.033
## block5:step3 28.07055 90.34959 0.311
## block6:step3 0.04634 91.58179 0.001
## block2:step4 -33.78754 90.06083 -0.375
## block3:step4 46.27651 90.43345 0.512
## block4:step4 -49.04116 90.73180 -0.541
## block5:step4 -12.93562 90.34959 -0.143
## block6:step4 -33.64103 91.58179 -0.367
## block2:step5 -44.69624 90.06083 -0.496
## block3:step5 -50.87811 90.43345 -0.563
## block4:step5 -142.03264 90.73180 -1.565
## block5:step5 -174.08001 90.34959 -1.927
## block6:step5 42.23254 91.58179 0.461
## block2:step6 1.97586 90.06083 0.022
## block3:step6 -72.97971 90.43345 -0.807
## block4:step6 -188.81832 90.73180 -2.081
## block5:step6 -194.14846 90.34959 -2.149
## block6:step6 -9.32559 91.58179 -0.102
##
## Correlation matrix not shown by default, as p = 36 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.c3.theta)
m.c4.theta <- lmer(C4~ block * step + (1|subject), data = dfeeg)
Anova(m.c4.theta)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: C4
## Chisq Df Pr(>Chisq)
## block 37.123 5 5.659e-07 ***
## step 85.572 5 < 2.2e-16 ***
## block:step 18.689 25 0.8118
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.c4.theta)
## Linear mixed model fit by REML ['lmerMod']
## Formula: C4 ~ block * step + (1 | subject)
## Data: dfeeg
##
## REML criterion at convergence: 296402.8
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.102 -0.233 -0.108 0.031 39.918
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 117871 343.3
## Residual 2365685 1538.1
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 177.988 125.119 1.423
## block2 -44.807 102.916 -0.435
## block3 24.925 103.353 0.241
## block4 47.398 103.701 0.457
## block5 27.374 103.266 0.265
## block6 19.699 104.674 0.188
## step2 312.627 107.952 2.896
## step3 404.029 107.952 3.743
## step4 415.158 107.952 3.846
## step5 457.280 107.952 4.236
## step6 239.009 107.952 2.214
## block2:step2 -185.972 145.511 -1.278
## block3:step2 -115.457 146.113 -0.790
## block4:step2 -92.278 146.595 -0.629
## block5:step2 -89.274 145.978 -0.612
## block6:step2 12.148 147.969 0.082
## block2:step3 -175.367 145.511 -1.205
## block3:step3 -128.633 146.113 -0.880
## block4:step3 -141.570 146.595 -0.966
## block5:step3 -223.460 145.978 -1.531
## block6:step3 8.238 147.969 0.056
## block2:step4 -196.686 145.511 -1.352
## block3:step4 -57.536 146.113 -0.394
## block4:step4 -173.477 146.595 -1.183
## block5:step4 -156.105 145.978 -1.069
## block6:step4 -4.533 147.969 -0.031
## block2:step5 -259.265 145.511 -1.782
## block3:step5 -293.510 146.113 -2.009
## block4:step5 -238.437 146.595 -1.627
## block5:step5 -347.201 145.978 -2.378
## block6:step5 5.365 147.969 0.036
## block2:step6 -82.040 145.511 -0.564
## block3:step6 -187.060 146.113 -1.280
## block4:step6 -121.091 146.595 -0.826
## block5:step6 -203.844 145.978 -1.396
## block6:step6 -93.637 147.969 -0.633
##
## Correlation matrix not shown by default, as p = 36 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.c4.theta)
m.cz.theta <- lmer(Cz~ block * step + (1|subject), data = dfeeg)
Anova(m.cz.theta)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: Cz
## Chisq Df Pr(>Chisq)
## block 65.624 5 8.319e-13 ***
## step 178.282 5 < 2.2e-16 ***
## block:step 50.753 25 0.001719 **
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.cz.theta)
## Linear mixed model fit by REML ['lmerMod']
## Formula: Cz ~ block * step + (1 | subject)
## Data: dfeeg
##
## REML criterion at convergence: 302352.5
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.749 -0.240 -0.076 0.060 36.713
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 490902 700.6
## Residual 3361091 1833.3
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 257.049 221.799 1.159
## block2 4.533 122.672 0.037
## block3 24.660 123.193 0.200
## block4 -76.164 123.608 -0.616
## block5 -10.709 123.089 -0.087
## block6 -45.419 124.768 -0.364
## step2 225.948 128.674 1.756
## step3 332.868 128.674 2.587
## step4 446.491 128.674 3.470
## step5 547.576 128.674 4.256
## step6 171.819 128.674 1.335
## block2:step2 183.166 173.443 1.056
## block3:step2 274.381 174.161 1.575
## block4:step2 -1.543 174.736 -0.009
## block5:step2 -92.054 174.000 -0.529
## block6:step2 252.827 176.373 1.433
## block2:step3 290.656 173.443 1.676
## block3:step3 349.018 174.161 2.004
## block4:step3 -97.171 174.736 -0.556
## block5:step3 -234.883 174.000 -1.350
## block6:step3 319.779 176.373 1.813
## block2:step4 224.677 173.443 1.295
## block3:step4 172.512 174.161 0.991
## block4:step4 -131.502 174.736 -0.753
## block5:step4 -180.662 174.000 -1.038
## block6:step4 163.725 176.373 0.928
## block2:step5 -159.568 173.443 -0.920
## block3:step5 -317.387 174.161 -1.822
## block4:step5 -262.458 174.736 -1.502
## block5:step5 -406.794 174.000 -2.338
## block6:step5 -176.505 176.373 -1.001
## block2:step6 -119.846 173.443 -0.691
## block3:step6 -190.309 174.161 -1.093
## block4:step6 -108.267 174.736 -0.620
## block5:step6 -234.155 174.000 -1.346
## block6:step6 -161.500 176.373 -0.916
##
## Correlation matrix not shown by default, as p = 36 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.cz.theta)
m.cz.theta2 <- lmer(Cz~ block * step * feedback.RT + (1|subject), data = dfeeg)
Anova(m.cz.theta2)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: Cz
## Chisq Df Pr(>Chisq)
## block 90.906 5 < 2.2e-16 ***
## step 121.081 5 < 2.2e-16 ***
## feedback.RT 13.120 1 0.0002922 ***
## block:step 41.568 25 0.0199917 *
## block:feedback.RT 28.688 5 2.669e-05 ***
## step:feedback.RT 87.731 5 < 2.2e-16 ***
## block:step:feedback.RT 48.362 25 0.0033745 **
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.cz.theta2)
## Linear mixed model fit by REML ['lmerMod']
## Formula: Cz ~ block * step * feedback.RT + (1 | subject)
## Data: dfeeg
##
## REML criterion at convergence: 302168.5
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.919 -0.233 -0.073 0.074 36.836
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 472774 687.6
## Residual 3331876 1825.3
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 240.89959 285.14066 0.845
## block2 -72.56479 292.61090 -0.248
## block3 -129.96371 295.86159 -0.439
## block4 -99.61689 280.73303 -0.355
## block5 -46.60878 263.38166 -0.177
## block6 1.26008 282.50328 0.004
## step2 650.63283 279.58011 2.327
## step3 842.60524 280.87972 3.000
## step4 860.56494 271.89663 3.165
## step5 878.88333 278.93212 3.151
## step6 331.00271 274.27705 1.207
## feedback.RT 0.02600 0.18149 0.143
## block2:step2 152.60813 380.08201 0.402
## block3:step2 554.47109 378.22425 1.466
## block4:step2 -368.44738 365.03463 -1.009
## block5:step2 -471.34364 352.81254 -1.336
## block6:step2 149.28877 372.81597 0.400
## block2:step3 467.94756 380.61202 1.229
## block3:step3 838.89488 382.18500 2.195
## block4:step3 -517.54319 367.98458 -1.406
## block5:step3 -725.98752 350.24272 -2.073
## block6:step3 438.59825 373.30858 1.175
## block2:step4 359.56346 376.51976 0.955
## block3:step4 479.90577 372.74503 1.287
## block4:step4 -521.01310 362.97318 -1.435
## block5:step4 -409.90345 347.29726 -1.180
## block6:step4 42.39568 364.42021 0.116
## block2:step5 -117.02949 386.99137 -0.302
## block3:step5 -383.52046 384.72694 -0.997
## block4:step5 -652.44120 369.86249 -1.764
## block5:step5 -792.44247 358.42140 -2.211
## block6:step5 -413.47240 371.28325 -1.114
## block2:step6 -331.95941 372.58205 -0.891
## block3:step6 -229.94084 371.55116 -0.619
## block4:step6 -360.39225 355.49430 -1.014
## block5:step6 -470.73524 344.90966 -1.365
## block6:step6 -396.73248 375.37336 -1.057
## block2:feedback.RT 0.09491 0.30423 0.312
## block3:feedback.RT 0.23920 0.36004 0.664
## block4:feedback.RT 0.03065 0.33880 0.090
## block5:feedback.RT 0.05979 0.32909 0.182
## block6:feedback.RT -0.07711 0.31663 -0.244
## step2:feedback.RT -0.96193 0.43462 -2.213
## step3:feedback.RT -1.15201 0.43627 -2.641
## step4:feedback.RT -0.99696 0.42825 -2.328
## step5:feedback.RT -0.74147 0.43178 -1.717
## step6:feedback.RT -0.37355 0.45367 -0.823
## block2:step2:feedback.RT -0.11145 0.63984 -0.174
## block3:step2:feedback.RT -1.26424 0.67100 -1.884
## block4:step2:feedback.RT 0.81480 0.66272 1.229
## block5:step2:feedback.RT 0.87484 0.70115 1.248
## block6:step2:feedback.RT -0.22946 0.66928 -0.343
## block2:step3:feedback.RT -0.96363 0.65262 -1.477
## block3:step3:feedback.RT -2.40319 0.71957 -3.340
## block4:step3:feedback.RT 0.86737 0.70192 1.236
## block5:step3:feedback.RT 1.18541 0.67921 1.745
## block6:step3:feedback.RT -1.03059 0.65695 -1.569
## block2:step4:feedback.RT -0.74119 0.68205 -1.087
## block3:step4:feedback.RT -1.55861 0.70275 -2.218
## block4:step4:feedback.RT 0.98570 0.75279 1.309
## block5:step4:feedback.RT 0.22407 0.75059 0.299
## block6:step4:feedback.RT -0.02508 0.63103 -0.040
## block2:step5:feedback.RT -0.26020 0.67963 -0.383
## block3:step5:feedback.RT 0.12260 0.72160 0.170
## block4:step5:feedback.RT 1.04631 0.70506 1.484
## block5:step5:feedback.RT 1.09159 0.76258 1.431
## block6:step5:feedback.RT 0.37010 0.64303 0.576
## block2:step6:feedback.RT 0.72114 0.62817 1.148
## block3:step6:feedback.RT 0.27842 0.65123 0.428
## block4:step6:feedback.RT 0.76550 0.61283 1.249
## block5:step6:feedback.RT 0.78606 0.66124 1.189
## block6:step6:feedback.RT 0.56629 0.71643 0.790
##
## Correlation matrix not shown by default, as p = 72 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.cz.theta2)
AIC (m.c3.theta, m.c4.theta, m.cz.theta)
## df AIC
## m.c3.theta 38 280251.1
## m.c4.theta 38 296478.8
## m.cz.theta 38 302428.5
BIC (m.c3.theta, m.c4.theta, m.cz.theta)
## df BIC
## m.c3.theta 38 280545.2
## m.c4.theta 38 296772.8
## m.cz.theta 38 302722.6
#Cz Posthocs blocks
emmp.m.cz.theta<-emmip(m.cz.theta, ~ step|block)
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'pbkrtest.limit = 16944' (or larger)
## [or, globally, 'set emm_options(pbkrtest.limit = 16944)' or larger];
## but be warned that this may result in large computation time and memory use.
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'lmerTest.limit = 16944' (or larger)
## [or, globally, 'set emm_options(lmerTest.limit = 16944)' or larger];
## but be warned that this may result in large computation time and memory use.
print(emmp.m.cz.theta)
emm.m.cz.theta <- emmeans(m.cz.theta, pairwise ~ step|block)
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'pbkrtest.limit = 16944' (or larger)
## [or, globally, 'set emm_options(pbkrtest.limit = 16944)' or larger];
## but be warned that this may result in large computation time and memory use.
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'lmerTest.limit = 16944' (or larger)
## [or, globally, 'set emm_options(lmerTest.limit = 16944)' or larger];
## but be warned that this may result in large computation time and memory use.
print(emm.m.cz.theta)
## $emmeans
## block = 1:
## step emmean SE df asymp.LCL asymp.UCL
## 1 257 222 Inf -177.67 692
## 2 483 222 Inf 48.28 918
## 3 590 222 Inf 155.20 1025
## 4 704 222 Inf 268.82 1138
## 5 805 222 Inf 369.91 1239
## 6 429 222 Inf -5.85 864
##
## block = 2:
## step emmean SE df asymp.LCL asymp.UCL
## 1 262 218 Inf -166.36 690
## 2 671 218 Inf 242.76 1099
## 3 885 218 Inf 457.17 1313
## 4 933 218 Inf 504.81 1361
## 5 650 218 Inf 221.65 1078
## 6 314 218 Inf -114.38 741
##
## block = 3:
## step emmean SE df asymp.LCL asymp.UCL
## 1 282 219 Inf -146.79 710
## 2 782 219 Inf 353.54 1211
## 3 964 219 Inf 535.09 1392
## 4 901 219 Inf 472.21 1329
## 5 512 219 Inf 83.40 940
## 6 263 219 Inf -165.28 692
##
## block = 4:
## step emmean SE df asymp.LCL asymp.UCL
## 1 181 219 Inf -248.08 610
## 2 405 219 Inf -23.67 834
## 3 417 219 Inf -12.38 846
## 4 496 219 Inf 66.91 925
## 5 466 219 Inf 37.04 895
## 6 244 219 Inf -184.52 673
##
## block = 5:
## step emmean SE df asymp.LCL asymp.UCL
## 1 246 219 Inf -182.04 675
## 2 380 219 Inf -48.15 809
## 3 344 219 Inf -84.06 773
## 4 512 219 Inf 83.79 941
## 5 387 219 Inf -41.26 816
## 6 184 219 Inf -244.38 612
##
## block = 6:
## step emmean SE df asymp.LCL asymp.UCL
## 1 212 220 Inf -218.62 642
## 2 690 220 Inf 260.16 1121
## 3 864 220 Inf 434.03 1295
## 4 822 220 Inf 391.60 1252
## 5 583 220 Inf 152.45 1013
## 6 222 220 Inf -208.30 652
##
## Degrees-of-freedom method: asymptotic
## Confidence level used: 0.95
##
## $contrasts
## block = 1:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -225.95 129 Inf -1.756 0.4945
## step1 - step3 -332.87 129 Inf -2.587 0.1004
## step1 - step4 -446.49 129 Inf -3.470 0.0069
## step1 - step5 -547.58 129 Inf -4.256 0.0003
## step1 - step6 -171.82 129 Inf -1.335 0.7653
## step2 - step3 -106.92 129 Inf -0.831 0.9619
## step2 - step4 -220.54 129 Inf -1.714 0.5224
## step2 - step5 -321.63 129 Inf -2.500 0.1241
## step2 - step6 54.13 129 Inf 0.421 0.9983
## step3 - step4 -113.62 129 Inf -0.883 0.9507
## step3 - step5 -214.71 129 Inf -1.669 0.5527
## step3 - step6 161.05 129 Inf 1.252 0.8112
## step4 - step5 -101.08 129 Inf -0.786 0.9700
## step4 - step6 274.67 129 Inf 2.135 0.2693
## step5 - step6 375.76 129 Inf 2.920 0.0409
##
## block = 2:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -409.11 116 Inf -3.518 0.0058
## step1 - step3 -623.52 116 Inf -5.361 <.0001
## step1 - step4 -671.17 116 Inf -5.771 <.0001
## step1 - step5 -388.01 116 Inf -3.336 0.0110
## step1 - step6 -51.97 116 Inf -0.447 0.9978
## step2 - step3 -214.41 116 Inf -1.844 0.4375
## step2 - step4 -262.05 116 Inf -2.253 0.2136
## step2 - step5 21.11 116 Inf 0.181 1.0000
## step2 - step6 357.14 116 Inf 3.071 0.0260
## step3 - step4 -47.64 116 Inf -0.410 0.9985
## step3 - step5 235.52 116 Inf 2.025 0.3279
## step3 - step6 571.55 116 Inf 4.914 <.0001
## step4 - step5 283.16 116 Inf 2.435 0.1443
## step4 - step6 619.20 116 Inf 5.324 <.0001
## step5 - step6 336.04 116 Inf 2.889 0.0447
##
## block = 3:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -500.33 117 Inf -4.263 0.0003
## step1 - step3 -681.89 117 Inf -5.810 <.0001
## step1 - step4 -619.00 117 Inf -5.274 <.0001
## step1 - step5 -230.19 117 Inf -1.961 0.3648
## step1 - step6 18.49 117 Inf 0.158 1.0000
## step2 - step3 -181.56 117 Inf -1.547 0.6337
## step2 - step4 -118.67 117 Inf -1.011 0.9144
## step2 - step5 270.14 117 Inf 2.302 0.1932
## step2 - step6 518.82 117 Inf 4.420 0.0001
## step3 - step4 62.88 117 Inf 0.536 0.9947
## step3 - step5 451.70 117 Inf 3.849 0.0017
## step3 - step6 700.38 117 Inf 5.967 <.0001
## step4 - step5 388.81 117 Inf 3.313 0.0119
## step4 - step6 637.49 117 Inf 5.432 <.0001
## step5 - step6 248.68 117 Inf 2.119 0.2774
##
## block = 4:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -224.41 118 Inf -1.898 0.4031
## step1 - step3 -235.70 118 Inf -1.994 0.3458
## step1 - step4 -314.99 118 Inf -2.664 0.0825
## step1 - step5 -285.12 118 Inf -2.412 0.1520
## step1 - step6 -63.55 118 Inf -0.538 0.9946
## step2 - step3 -11.29 118 Inf -0.096 1.0000
## step2 - step4 -90.58 118 Inf -0.766 0.9731
## step2 - step5 -60.71 118 Inf -0.514 0.9957
## step2 - step6 160.85 118 Inf 1.361 0.7506
## step3 - step4 -79.29 118 Inf -0.671 0.9851
## step3 - step5 -49.42 118 Inf -0.418 0.9984
## step3 - step6 172.14 118 Inf 1.456 0.6923
## step4 - step5 29.87 118 Inf 0.253 0.9999
## step4 - step6 251.44 118 Inf 2.127 0.2733
## step5 - step6 221.57 118 Inf 1.874 0.4181
##
## block = 5:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -133.89 117 Inf -1.143 0.8633
## step1 - step3 -97.99 117 Inf -0.837 0.9607
## step1 - step4 -265.83 117 Inf -2.270 0.2066
## step1 - step5 -140.78 117 Inf -1.202 0.8361
## step1 - step6 62.34 117 Inf 0.532 0.9949
## step2 - step3 35.91 117 Inf 0.307 0.9996
## step2 - step4 -131.93 117 Inf -1.126 0.8706
## step2 - step5 -6.89 117 Inf -0.059 1.0000
## step2 - step6 196.23 117 Inf 1.675 0.5482
## step3 - step4 -167.84 117 Inf -1.433 0.7068
## step3 - step5 -42.80 117 Inf -0.365 0.9992
## step3 - step6 160.32 117 Inf 1.369 0.7458
## step4 - step5 125.05 117 Inf 1.068 0.8943
## step4 - step6 328.16 117 Inf 2.802 0.0572
## step5 - step6 203.12 117 Inf 1.734 0.5090
##
## block = 6:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -478.78 121 Inf -3.969 0.0010
## step1 - step3 -652.65 121 Inf -5.411 <.0001
## step1 - step4 -610.22 121 Inf -5.059 <.0001
## step1 - step5 -371.07 121 Inf -3.076 0.0256
## step1 - step6 -10.32 121 Inf -0.086 1.0000
## step2 - step3 -173.87 121 Inf -1.441 0.7016
## step2 - step4 -131.44 121 Inf -1.090 0.8857
## step2 - step5 107.70 121 Inf 0.893 0.9483
## step2 - step6 468.46 121 Inf 3.884 0.0014
## step3 - step4 42.43 121 Inf 0.352 0.9993
## step3 - step5 281.58 121 Inf 2.334 0.1803
## step3 - step6 642.33 121 Inf 5.325 <.0001
## step4 - step5 239.15 121 Inf 1.983 0.3523
## step4 - step6 599.90 121 Inf 4.973 <.0001
## step5 - step6 360.75 121 Inf 2.991 0.0332
##
## Degrees-of-freedom method: asymptotic
## P value adjustment: tukey method for comparing a family of 6 estimates
#Cz effects
ae.m.cz.theta<-allEffects(m.cz.theta)
ae.m.cz.theta.df<-as.data.frame(ae.m.cz.theta[[1]])
plot(ae.m.cz.theta)
#Cz2 effects
ae.m.cz.theta2<-allEffects(m.cz.theta2)
ae.m.cz.theta2.df<-as.data.frame(ae.m.cz.theta2[[1]])
plot(ae.m.cz.theta2.df)
#Cz change conf interval to 83%, match p = .05
ae.m.cz.theta.df$l83 <- ae.m.cz.theta.df$fit - 1.3722 * ae.m.cz.theta.df$se
ae.m.cz.theta.df$u83 <- ae.m.cz.theta.df$fit + 1.3722 * ae.m.cz.theta.df$se
#Cz change conf interval to 83%, match p = .05
ae.m.cz.theta2.df$l83 <- ae.m.cz.theta2.df$fit - 1.3722 * ae.m.cz.theta2.df$se
ae.m.cz.theta2.df$u83 <- ae.m.cz.theta2.df$fit + 1.3722 * ae.m.cz.theta2.df$se
#Cz Effects Plot
plot.cztheta <- ggplot(ae.m.cz.theta.df, aes(x=step, y=fit, ymin=l83, ymax=u83))+
geom_point(aes(color = block), size=3) +
geom_path(aes(x=step, y=fit, group=block, colour=block)) +
geom_ribbon(aes(ymin=l83, ymax=u83, group=block, fill=block), alpha=0.2) +
ylab("ERDS (%)")+
xlab("Step Position")+
ggtitle("Learning Phase Concatenation ERDS")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))+
facet_wrap(~block)
print(plot.cztheta)
#Cz Effects Plot2
plot.cztheta2 <- ggplot(ae.m.cz.theta2.df, aes(x=feedback.RT, y=fit, ymin=l83, ymax=u83))+
#geom_point(aes(color = block), size=3) +
geom_path(aes(x=feedback.RT, y=fit, colour = step)) +
geom_ribbon(aes(ymin=l83, ymax=u83, colour = step), alpha=0.2) +
ylab("Block")+
xlab("Step Position")+
ggtitle("Learning Phase changes: ERDS * RT changes")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))+
facet_wrap(~block*step, labeller= label_both) #block=y-axis, step=x-axis
print(plot.cztheta2)
#Cz Effects Plot
#plot.cztheta <- ggplot(ae.m.contrainRT.df, aes(x=stepNumber, y=fit, ymin=l83, ymax=u83))+
#geom_point(aes(color = session), size=3) +
#geom_path(aes(x=stepNumber, y=fit, group=session, colour=session)) +
#geom_ribbon(aes(ymin=l83, ymax=u83, group=session, fill=session), alpha=0.2) +
#ylab("ERDS (%)")+
#xlab("Step Position")+
#ggtitle("Learning Phase Concatenation")+
#theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))
#print(plot.cztheta)
#Bar Prep Beta - Block * Hand * Timepoint
#plot.mot.thetaC3 <- ggplot(ae.lm.c3.theta.df, aes(x=step, y=fit, group=subject)) +
#geom_errorbar(aes(ymin=l83, ymax=u83, color=subject), width =.3, alpha = .8) +
#geom_line(aes(color=subject), size = 1.5) +
#geom_point(aes(color=subject, shape=subject),size=5) +
#ylab("ERD/S (%)")+
#xlab("Step No.")+
#ggtitle("C3 Sequence θ: Subject x Block x Step interactions") +
#scale_fill_manual(values=c('#999999','#0072B2'), name="Block") +
#scale_color_manual(values=c('#999999','#0072B2'), name="Block") +
#theme_classic(base_size = 12) +
#facet_wrap(~block)
#print (plot.mot.thetaC3)
setwd("C:/Users/cutba/OneDrive - University of Twente/1_Conferences/2024_Conferences/Mobi_June24/Analysis/EEGDFs")
#dfeeg = read_excel("eeg_data_theta_RT.xlsx")
dfeegB <- read_excel("eeg_data_beta_RT.xlsx",
col_types = c("numeric", "numeric", "numeric",
"numeric", "numeric", "numeric",
"numeric", "numeric"))
#dfeegB = read_excel("eeg_data_beta_RT.xlsx")
#factors
dfeegB$subject <- factor(dfeegB$subject)
dfeegB$block <- factor(dfeegB$block)
dfeegB$step <- factor(dfeegB$step)
#All Theta models
m.c3.beta <- lmer(C3~ block * step + (1|subject), data = dfeegB)
Anova(m.c3.beta)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: C3
## Chisq Df Pr(>Chisq)
## block 67.947 5 2.739e-13 ***
## step 131.267 5 < 2.2e-16 ***
## block:step 54.974 25 0.000496 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.c3.beta)
## Linear mixed model fit by REML ['lmerMod']
## Formula: C3 ~ block * step + (1 | subject)
## Data: dfeegB
##
## REML criterion at convergence: 280456.5
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.291 -0.211 -0.073 0.068 60.974
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 52203 228.5
## Residual 921146 959.8
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 68.51 81.37 0.842
## block2 12.51 64.22 0.195
## block3 33.78 64.49 0.524
## block4 12.81 64.71 0.198
## block5 51.68 64.44 0.802
## block6 10.37 65.32 0.159
## step2 177.59 67.36 2.636
## step3 443.96 67.36 6.591
## step4 402.37 67.36 5.973
## step5 504.17 67.36 7.485
## step6 184.23 67.36 2.735
## block2:step2 -59.38 90.80 -0.654
## block3:step2 -71.84 91.17 -0.788
## block4:step2 -52.25 91.48 -0.571
## block5:step2 -89.91 91.09 -0.987
## block6:step2 -120.90 92.33 -1.309
## block2:step3 -207.65 90.80 -2.287
## block3:step3 -266.56 91.17 -2.924
## block4:step3 -309.63 91.48 -3.385
## block5:step3 -337.41 91.09 -3.704
## block6:step3 -391.30 92.33 -4.238
## block2:step4 -54.93 90.80 -0.605
## block3:step4 -193.71 91.17 -2.125
## block4:step4 -225.17 91.48 -2.461
## block5:step4 -175.66 91.09 -1.928
## block6:step4 -326.31 92.33 -3.534
## block2:step5 -286.04 90.80 -3.150
## block3:step5 -305.96 91.17 -3.356
## block4:step5 -265.63 91.48 -2.904
## block5:step5 -351.16 91.09 -3.855
## block6:step5 -335.19 92.33 -3.630
## block2:step6 63.52 90.80 0.700
## block3:step6 -123.62 91.17 -1.356
## block4:step6 -104.53 91.48 -1.143
## block5:step6 -175.06 91.09 -1.922
## block6:step6 -115.72 92.33 -1.253
##
## Correlation matrix not shown by default, as p = 36 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.c3.beta)
m.c4.beta <- lmer(C4~ block * step + (1|subject), data = dfeegB)
Anova(m.c4.beta)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: C4
## Chisq Df Pr(>Chisq)
## block 69.640 5 1.218e-13 ***
## step 181.501 5 < 2.2e-16 ***
## block:step 76.756 25 3.646e-07 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.c4.beta)
## Linear mixed model fit by REML ['lmerMod']
## Formula: C4 ~ block * step + (1 | subject)
## Data: dfeegB
##
## REML criterion at convergence: 263393.9
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.498 -0.307 -0.113 0.102 53.324
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 39587 199.0
## Residual 335628 579.3
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 57.3021 64.2369 0.892
## block2 14.7842 38.7645 0.381
## block3 40.8494 38.9290 1.049
## block4 45.9617 39.0604 1.177
## block5 103.3634 38.8964 2.657
## block6 26.2859 39.4268 0.667
## step2 116.8157 40.6613 2.873
## step3 146.9219 40.6613 3.613
## step4 201.9483 40.6613 4.967
## step5 216.5285 40.6613 5.325
## step6 87.5908 40.6613 2.154
## block2:step2 -46.4908 54.8083 -0.848
## block3:step2 17.2724 55.0351 0.314
## block4:step2 100.3934 55.2167 1.818
## block5:step2 30.5407 54.9841 0.555
## block6:step2 -69.4456 55.7340 -1.246
## block2:step3 -19.4762 54.8083 -0.355
## block3:step3 26.5541 55.0351 0.482
## block4:step3 62.6693 55.2167 1.135
## block5:step3 0.1868 54.9841 0.003
## block6:step3 -100.5031 55.7340 -1.803
## block2:step4 -53.3771 54.8083 -0.974
## block3:step4 -19.3128 55.0351 -0.351
## block4:step4 47.5346 55.2167 0.861
## block5:step4 -5.7810 54.9841 -0.105
## block6:step4 -139.1182 55.7340 -2.496
## block2:step5 -72.9591 54.8083 -1.331
## block3:step5 -89.2662 55.0351 -1.622
## block4:step5 -83.8291 55.2167 -1.518
## block5:step5 -192.2652 54.9841 -3.497
## block6:step5 -85.3483 55.7340 -1.531
## block2:step6 4.8229 54.8083 0.088
## block3:step6 -48.6331 55.0351 -0.884
## block4:step6 -57.4381 55.2167 -1.040
## block5:step6 -122.3617 54.9841 -2.225
## block6:step6 -31.8635 55.7340 -0.572
##
## Correlation matrix not shown by default, as p = 36 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.c4.beta)
m.cz.beta <- lmer(Cz~ block * step + (1|subject), data = dfeegB)
Anova(m.cz.beta)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: Cz
## Chisq Df Pr(>Chisq)
## block 126.814 5 < 2.2e-16 ***
## step 335.406 5 < 2.2e-16 ***
## block:step 81.343 25 7.018e-08 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.cz.beta)
## Linear mixed model fit by REML ['lmerMod']
## Formula: Cz ~ block * step + (1 | subject)
## Data: dfeegB
##
## REML criterion at convergence: 272823.6
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.605 -0.353 -0.116 0.113 45.252
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 61131 247.2
## Residual 586275 765.7
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 89.10739 80.86808 1.102
## block2 14.54132 51.23371 0.284
## block3 45.23408 51.45113 0.879
## block4 50.93464 51.62475 0.987
## block5 148.33551 51.40802 2.885
## block6 -12.36340 52.10902 -0.237
## step2 269.43894 53.74061 5.014
## step3 202.97542 53.74061 3.777
## step4 197.07850 53.74061 3.667
## step5 173.76491 53.74061 3.233
## step6 101.93820 53.74061 1.897
## block2:step2 60.99766 72.43830 0.842
## block3:step2 126.03100 72.73801 1.733
## block4:step2 26.85023 72.97798 0.368
## block5:step2 0.05214 72.67057 0.001
## block6:step2 -196.04483 73.66165 -2.661
## block2:step3 168.44019 72.43830 2.325
## block3:step3 98.70854 72.73801 1.357
## block4:step3 27.18214 72.97798 0.372
## block5:step3 52.71266 72.67057 0.725
## block6:step3 -103.86713 73.66165 -1.410
## block2:step4 113.11239 72.43830 1.561
## block3:step4 40.66019 72.73801 0.559
## block4:step4 34.11967 72.97798 0.468
## block5:step4 90.60521 72.67057 1.247
## block6:step4 -83.37902 73.66165 -1.132
## block2:step5 35.49602 72.43830 0.490
## block3:step5 -6.57727 72.73801 -0.090
## block4:step5 19.70541 72.97798 0.270
## block5:step5 -128.30226 72.67057 -1.766
## block6:step5 -25.04310 73.66165 -0.340
## block2:step6 -46.63430 72.43830 -0.644
## block3:step6 -68.54494 72.73801 -0.942
## block4:step6 -86.34459 72.97798 -1.183
## block5:step6 -201.28493 72.67057 -2.770
## block6:step6 -48.02474 73.66165 -0.652
##
## Correlation matrix not shown by default, as p = 36 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.cz.beta)
m.cz.beta2 <- lmer(Cz~ block * step * feedback.RT + (1|subject), data = dfeegB)
Anova(m.cz.beta2)
## Analysis of Deviance Table (Type II Wald chisquare tests)
##
## Response: Cz
## Chisq Df Pr(>Chisq)
## block 101.089 5 < 2.2e-16 ***
## step 200.284 5 < 2.2e-16 ***
## feedback.RT 63.582 1 1.538e-15 ***
## block:step 71.954 25 1.965e-06 ***
## block:feedback.RT 38.231 5 3.390e-07 ***
## step:feedback.RT 236.654 5 < 2.2e-16 ***
## block:step:feedback.RT 66.936 25 1.086e-05 ***
## ---
## Signif. codes: 0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
summary(m.cz.beta2)
## Linear mixed model fit by REML ['lmerMod']
## Formula: Cz ~ block * step * feedback.RT + (1 | subject)
## Data: dfeegB
##
## REML criterion at convergence: 272491.2
##
## Scaled residuals:
## Min 1Q Median 3Q Max
## -1.789 -0.349 -0.105 0.117 45.612
##
## Random effects:
## Groups Name Variance Std.Dev.
## subject (Intercept) 49652 222.8
## Residual 574005 757.6
## Number of obs: 16944, groups: subject, 12
##
## Fixed effects:
## Estimate Std. Error t value
## (Intercept) 77.27685 106.57008 0.725
## block2 -10.05754 121.45082 -0.083
## block3 82.83382 122.79981 0.675
## block4 80.02972 116.52071 0.687
## block5 197.93914 109.31909 1.811
## block6 -8.28001 117.25609 -0.071
## step2 668.10139 116.04144 5.757
## step3 479.98045 116.58133 4.117
## step4 389.22850 112.85280 3.449
## step5 223.22698 115.77305 1.928
## step6 121.96569 113.84086 1.071
## feedback.RT 0.02002 0.07533 0.266
## block2:step2 9.57719 157.75687 0.061
## block3:step2 81.12854 156.98519 0.517
## block4:step2 -175.60371 151.51100 -1.159
## block5:step2 -155.44365 146.43859 -1.061
## block6:step2 -522.76215 154.74113 -3.378
## block2:step3 390.74363 157.97694 2.473
## block3:step3 197.88905 158.62959 1.247
## block4:step3 -38.30932 152.73584 -0.251
## block5:step3 21.05570 145.37198 0.145
## block6:step3 -294.24880 154.94583 -1.899
## block2:step4 273.16663 156.27862 1.748
## block3:step4 58.98491 154.71109 0.381
## block4:step4 5.62846 150.65575 0.037
## block5:step4 125.02009 144.14944 0.867
## block6:step4 -193.37690 151.25665 -1.278
## block2:step5 245.82337 160.62505 1.530
## block3:step5 -21.13285 159.68466 -0.132
## block4:step5 40.65841 153.51509 0.265
## block5:step5 -199.24787 148.76675 -1.339
## block6:step5 -22.92858 154.10513 -0.149
## block2:step6 -29.73962 154.64359 -0.192
## block3:step6 -52.81197 154.21507 -0.342
## block4:step6 -137.39746 147.55047 -0.931
## block5:step6 -289.81488 143.15808 -2.024
## block6:step6 1.57145 155.80295 0.010
## block2:feedback.RT 0.02886 0.12627 0.229
## block3:feedback.RT -0.06399 0.14944 -0.428
## block4:feedback.RT -0.05661 0.14062 -0.403
## block5:feedback.RT -0.10393 0.13659 -0.761
## block6:feedback.RT -0.01429 0.13142 -0.109
## step2:feedback.RT -0.90903 0.18039 -5.039
## step3:feedback.RT -0.61806 0.18107 -3.413
## step4:feedback.RT -0.45047 0.17774 -2.534
## step5:feedback.RT -0.08858 0.17921 -0.494
## step6:feedback.RT -0.01948 0.18829 -0.103
## block2:step2:feedback.RT -0.12435 0.26557 -0.468
## block3:step2:feedback.RT -0.44298 0.27851 -1.591
## block4:step2:feedback.RT 0.10055 0.27507 0.366
## block5:step2:feedback.RT -0.24548 0.29102 -0.844
## block6:step2:feedback.RT 0.66554 0.27779 2.396
## block2:step3:feedback.RT -0.98445 0.27088 -3.634
## block3:step3:feedback.RT -0.93789 0.29866 -3.140
## block4:step3:feedback.RT -0.31472 0.29134 -1.080
## block5:step3:feedback.RT -0.60192 0.28191 -2.135
## block6:step3:feedback.RT 0.33361 0.27267 1.223
## block2:step4:feedback.RT -0.71690 0.28309 -2.532
## block3:step4:feedback.RT -0.49324 0.29168 -1.691
## block4:step4:feedback.RT -0.37120 0.31245 -1.188
## block5:step4:feedback.RT -0.79651 0.31154 -2.557
## block6:step4:feedback.RT 0.18811 0.26192 0.718
## block2:step5:feedback.RT -0.66025 0.28209 -2.341
## block3:step5:feedback.RT -0.09757 0.29950 -0.326
## block4:step5:feedback.RT -0.23462 0.29264 -0.802
## block5:step5:feedback.RT 0.07332 0.31651 0.232
## block6:step5:feedback.RT -0.07346 0.26690 -0.275
## block2:step6:feedback.RT -0.02402 0.26073 -0.092
## block3:step6:feedback.RT -0.15758 0.27030 -0.583
## block4:step6:feedback.RT 0.08712 0.25436 0.342
## block5:step6:feedback.RT 0.20265 0.27445 0.738
## block6:step6:feedback.RT -0.21083 0.29736 -0.709
##
## Correlation matrix not shown by default, as p = 72 > 12.
## Use print(x, correlation=TRUE) or
## vcov(x) if you need it
plot(m.cz.beta2)
AIC (m.c3.beta, m.c4.beta, m.cz.beta, m.cz.beta2)
## df AIC
## m.c3.beta 38 280532.5
## m.c4.beta 38 263469.9
## m.cz.beta 38 272899.6
## m.cz.beta2 74 272639.2
BIC (m.c3.beta, m.c4.beta, m.cz.beta, m.cz.beta2)
## df BIC
## m.c3.beta 38 280826.5
## m.c4.beta 38 263763.9
## m.cz.beta 38 273193.6
## m.cz.beta2 74 273211.7
#Cz Posthocs blocks
emm.m.cz.beta <- emmeans(m.cz.beta, pairwise ~ step|block)
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'pbkrtest.limit = 16944' (or larger)
## [or, globally, 'set emm_options(pbkrtest.limit = 16944)' or larger];
## but be warned that this may result in large computation time and memory use.
## Note: D.f. calculations have been disabled because the number of observations exceeds 3000.
## To enable adjustments, add the argument 'lmerTest.limit = 16944' (or larger)
## [or, globally, 'set emm_options(lmerTest.limit = 16944)' or larger];
## but be warned that this may result in large computation time and memory use.
print(emm.m.cz.beta)
## $emmeans
## block = 1:
## step emmean SE df asymp.LCL asymp.UCL
## 1 89.1 80.9 Inf -69.391 248
## 2 358.5 80.9 Inf 200.048 517
## 3 292.1 80.9 Inf 133.584 451
## 4 286.2 80.9 Inf 127.687 445
## 5 262.9 80.9 Inf 104.374 421
## 6 191.0 80.9 Inf 32.547 350
##
## block = 2:
## step emmean SE df asymp.LCL asymp.UCL
## 1 103.6 79.2 Inf -51.598 259
## 2 434.1 79.2 Inf 278.839 589
## 3 475.1 79.2 Inf 319.817 630
## 4 413.8 79.2 Inf 258.593 569
## 5 312.9 79.2 Inf 157.663 468
## 6 159.0 79.2 Inf 3.706 314
##
## block = 3:
## step emmean SE df asymp.LCL asymp.UCL
## 1 134.3 79.3 Inf -21.176 290
## 2 529.8 79.3 Inf 374.294 685
## 3 436.0 79.3 Inf 280.508 592
## 4 372.1 79.3 Inf 216.563 528
## 5 301.5 79.3 Inf 146.012 457
## 6 167.7 79.3 Inf 12.217 323
##
## block = 4:
## step emmean SE df asymp.LCL asymp.UCL
## 1 140.0 79.5 Inf -15.697 296
## 2 436.3 79.5 Inf 280.593 592
## 3 370.2 79.5 Inf 214.461 526
## 4 371.2 79.5 Inf 215.502 527
## 5 333.5 79.5 Inf 177.774 489
## 6 155.6 79.5 Inf -0.103 311
##
## block = 5:
## step emmean SE df asymp.LCL asymp.UCL
## 1 237.4 79.3 Inf 81.983 393
## 2 506.9 79.3 Inf 351.474 662
## 3 493.1 79.3 Inf 337.671 649
## 4 525.1 79.3 Inf 369.666 681
## 5 282.9 79.3 Inf 127.445 438
## 6 138.1 79.3 Inf -17.364 294
##
## block = 6:
## step emmean SE df asymp.LCL asymp.UCL
## 1 76.7 79.8 Inf -79.613 233
## 2 150.1 79.8 Inf -6.219 306
## 3 175.9 79.8 Inf 19.495 332
## 4 190.4 79.8 Inf 34.087 347
## 5 225.5 79.8 Inf 69.109 382
## 6 130.7 79.8 Inf -25.699 287
##
## Degrees-of-freedom method: asymptotic
## Confidence level used: 0.95
##
## $contrasts
## block = 1:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -269.44 53.7 Inf -5.014 <.0001
## step1 - step3 -202.98 53.7 Inf -3.777 0.0022
## step1 - step4 -197.08 53.7 Inf -3.667 0.0033
## step1 - step5 -173.76 53.7 Inf -3.233 0.0155
## step1 - step6 -101.94 53.7 Inf -1.897 0.4040
## step2 - step3 66.46 53.7 Inf 1.237 0.8188
## step2 - step4 72.36 53.7 Inf 1.346 0.7589
## step2 - step5 95.67 53.7 Inf 1.780 0.4785
## step2 - step6 167.50 53.7 Inf 3.117 0.0225
## step3 - step4 5.90 53.7 Inf 0.110 1.0000
## step3 - step5 29.21 53.7 Inf 0.544 0.9944
## step3 - step6 101.04 53.7 Inf 1.880 0.4144
## step4 - step5 23.31 53.7 Inf 0.434 0.9981
## step4 - step6 95.14 53.7 Inf 1.770 0.4851
## step5 - step6 71.83 53.7 Inf 1.337 0.7646
##
## block = 2:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -330.44 48.6 Inf -6.803 <.0001
## step1 - step3 -371.42 48.6 Inf -7.647 <.0001
## step1 - step4 -310.19 48.6 Inf -6.386 <.0001
## step1 - step5 -209.26 48.6 Inf -4.308 0.0002
## step1 - step6 -55.30 48.6 Inf -1.139 0.8653
## step2 - step3 -40.98 48.6 Inf -0.844 0.9593
## step2 - step4 20.25 48.6 Inf 0.417 0.9984
## step2 - step5 121.18 48.6 Inf 2.495 0.1255
## step2 - step6 275.13 48.6 Inf 5.664 <.0001
## step3 - step4 61.22 48.6 Inf 1.260 0.8065
## step3 - step5 162.15 48.6 Inf 3.338 0.0109
## step3 - step6 316.11 48.6 Inf 6.508 <.0001
## step4 - step5 100.93 48.6 Inf 2.078 0.2988
## step4 - step6 254.89 48.6 Inf 5.248 <.0001
## step5 - step6 153.96 48.6 Inf 3.170 0.0191
##
## block = 3:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -395.47 49.0 Inf -8.068 <.0001
## step1 - step3 -301.68 49.0 Inf -6.155 <.0001
## step1 - step4 -237.74 49.0 Inf -4.850 <.0001
## step1 - step5 -167.19 49.0 Inf -3.411 0.0085
## step1 - step6 -33.39 49.0 Inf -0.681 0.9841
## step2 - step3 93.79 49.0 Inf 1.913 0.3938
## step2 - step4 157.73 49.0 Inf 3.218 0.0163
## step2 - step5 228.28 49.0 Inf 4.657 <.0001
## step2 - step6 362.08 49.0 Inf 7.387 <.0001
## step3 - step4 63.95 49.0 Inf 1.305 0.7827
## step3 - step5 134.50 49.0 Inf 2.744 0.0669
## step3 - step6 268.29 49.0 Inf 5.473 <.0001
## step4 - step5 70.55 49.0 Inf 1.439 0.7029
## step4 - step6 204.35 49.0 Inf 4.169 0.0004
## step5 - step6 133.79 49.0 Inf 2.729 0.0695
##
## block = 4:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -296.29 49.4 Inf -6.001 <.0001
## step1 - step3 -230.16 49.4 Inf -4.662 <.0001
## step1 - step4 -231.20 49.4 Inf -4.683 <.0001
## step1 - step5 -193.47 49.4 Inf -3.919 0.0013
## step1 - step6 -15.59 49.4 Inf -0.316 0.9996
## step2 - step3 66.13 49.4 Inf 1.339 0.7630
## step2 - step4 65.09 49.4 Inf 1.318 0.7750
## step2 - step5 102.82 49.4 Inf 2.082 0.2964
## step2 - step6 280.70 49.4 Inf 5.685 <.0001
## step3 - step4 -1.04 49.4 Inf -0.021 1.0000
## step3 - step5 36.69 49.4 Inf 0.743 0.9765
## step3 - step6 214.56 49.4 Inf 4.346 0.0002
## step4 - step5 37.73 49.4 Inf 0.764 0.9735
## step4 - step6 215.60 49.4 Inf 4.367 0.0002
## step5 - step6 177.88 49.4 Inf 3.603 0.0043
##
## block = 5:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -269.49 48.9 Inf -5.509 <.0001
## step1 - step3 -255.69 48.9 Inf -5.227 <.0001
## step1 - step4 -287.68 48.9 Inf -5.881 <.0001
## step1 - step5 -45.46 48.9 Inf -0.929 0.9390
## step1 - step6 99.35 48.9 Inf 2.031 0.3246
## step2 - step3 13.80 48.9 Inf 0.282 0.9998
## step2 - step4 -18.19 48.9 Inf -0.372 0.9991
## step2 - step5 224.03 48.9 Inf 4.580 0.0001
## step2 - step6 368.84 48.9 Inf 7.540 <.0001
## step3 - step4 -32.00 48.9 Inf -0.654 0.9867
## step3 - step5 210.23 48.9 Inf 4.298 0.0002
## step3 - step6 355.03 48.9 Inf 7.258 <.0001
## step4 - step5 242.22 48.9 Inf 4.952 <.0001
## step4 - step6 387.03 48.9 Inf 7.912 <.0001
## step5 - step6 144.81 48.9 Inf 2.960 0.0363
##
## block = 6:
## contrast estimate SE df z.ratio p.value
## step1 - step2 -73.39 50.4 Inf -1.457 0.6919
## step1 - step3 -99.11 50.4 Inf -1.967 0.3613
## step1 - step4 -113.70 50.4 Inf -2.257 0.2120
## step1 - step5 -148.72 50.4 Inf -2.952 0.0372
## step1 - step6 -53.91 50.4 Inf -1.070 0.8933
## step2 - step3 -25.71 50.4 Inf -0.510 0.9958
## step2 - step4 -40.31 50.4 Inf -0.800 0.9676
## step2 - step5 -75.33 50.4 Inf -1.495 0.6674
## step2 - step6 19.48 50.4 Inf 0.387 0.9989
## step3 - step4 -14.59 50.4 Inf -0.290 0.9997
## step3 - step5 -49.61 50.4 Inf -0.985 0.9229
## step3 - step6 45.19 50.4 Inf 0.897 0.9473
## step4 - step5 -35.02 50.4 Inf -0.695 0.9825
## step4 - step6 59.79 50.4 Inf 1.187 0.8434
## step5 - step6 94.81 50.4 Inf 1.882 0.4133
##
## Degrees-of-freedom method: asymptotic
## P value adjustment: tukey method for comparing a family of 6 estimates
#Cz effects
ae.m.cz.beta<-allEffects(m.cz.beta)
ae.m.cz.beta.df<-as.data.frame(ae.m.cz.beta[[1]])
#Cz2 effects
ae.m.cz.beta2<-allEffects(m.cz.beta2)
ae.m.cz.beta2.df<-as.data.frame(ae.m.cz.beta2[[1]])
plot(ae.m.cz.beta2.df)
#Cz change conf interval to 83%, match p = .05
ae.m.cz.beta2.df$l83 <- ae.m.cz.beta2.df$fit - 1.3722 * ae.m.cz.beta2.df$se
ae.m.cz.beta2.df$u83 <- ae.m.cz.beta2.df$fit + 1.3722 * ae.m.cz.beta2.df$se
#Cz change conf interval to 83%, match p = .05
ae.m.cz.beta.df$l83 <- ae.m.cz.beta.df$fit - 1.3722 * ae.m.cz.beta.df$se
ae.m.cz.beta.df$u83 <- ae.m.cz.beta.df$fit + 1.3722 * ae.m.cz.beta.df$se
plot(ae.m.cz.beta)
#Cz Effects Plot
plot.czbeta <- ggplot(ae.m.cz.beta.df, aes(x=step, y=fit, ymin=l83, ymax=u83))+
geom_point(aes(color = block), size=3) +
geom_path(aes(x=step, y=fit, group=block, colour=block)) +
geom_ribbon(aes(ymin=l83, ymax=u83, group=block, fill=block), alpha=0.2) +
ylab("ERDS (%)")+
xlab("Step Position")+
ggtitle("Learning Phase Concatenation ERDS")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))+
facet_wrap(~block)
print(plot.czbeta)
#Cz Effects Plot2
plot.czbeta2 <- ggplot(ae.m.cz.beta2.df, aes(x=feedback.RT, y=fit, ymin=l83, ymax=u83))+
#geom_point(aes(color = block), size=3) +
geom_path(aes(x=feedback.RT, y=fit, colour = step)) +
geom_ribbon(aes(ymin=l83, ymax=u83, colour = step), alpha=0.2) +
ylab("Block")+
xlab("Step Position")+
ggtitle("Learning Phase changes: ERDS * RT changes")+
theme(panel.grid.major = element_blank(), panel.grid.minor = element_blank(),panel.background = element_blank(), axis.line = element_line(colour = "black"))+
facet_wrap(~block*step, labeller= label_both) #block=y-axis, step=x-axis
print(plot.czbeta2)
#Post arranged
#plot.post.ar.post <- ggarrange(plot.m.post.theta2, plot.m.post.alpha2, plot.m.post.beta2, ncol = 1, nrow = 3)
#plot.post.ar.post