1 Introduction

pacman::p_load(dplyr, simstudy, summarytools, kableExtra,
               brms, bayestestR, emmeans, lme4, sjPlot)
st_options(plain.ascii = F, footnote = NA)
knitr::opts_knit$set(root.dir = rprojroot::find_rstudio_root_file())
options(knitr.kable.NA = '')
options(mc.cores = parallel::detectCores(),
        brms.backend = "rstan")
resp4 <- readRDS("data/analysis_data/pretest_resp4.rds")
resp6 <- readRDS("data/analysis_data/pretest_resp6.rds")
resp12 <- readRDS("data/analysis_data/pretest_resp12.rds")
pt <- readRDS("data/analysis_data/pretest_ind_level.rds")
resp4$care_v <- relevel(resp4$care_v, ref = "no_care")
resp6$care_v <- relevel(resp6$care_v, ref = "no_care")
resp12$care_v <- relevel(resp12$care_v, ref = "no_care")

2 Analysis

2.1 Response scales

Higher values represent the earliest month, bimester or trimester, respectively.

tab12 <- table(factor(resp12$just_vac_n, levels = 1:12))
tab6 <- table(factor(resp6$just_vac_n, levels = 1:6))
tab4 <- table(factor(resp4$just_vac_n, levels = 1:4))
par(mfrow = c(3, 1))
barplot(prop.table(tab12), ylim = c(0, .7))
barplot(prop.table(tab6), ylim = c(0, .7))
barplot(prop.table(tab4), ylim = c(0, .7))

2.2 “I don’t know”

pt_idk <- bind_rows(
  select(resp12, idk, scale),
  select(resp6, idk, scale),
  select(resp4, idk, scale)
)

pt_idk %>% 
  group_by(scale) %>% 
  summarise(n_idk = sum(idk),
            prop_idk = sum(idk) / n(),
            Total = n()) %>% 
  kbl(digits = 3, caption = "Don't knows by response condition") %>% 
  kable_styling(bootstrap_options = c("striped", "bordered"))
Table 2.1: Don’t knows by response condition
scale n_idk prop_idk Total
r12 16 0.070 230
r4 16 0.052 305
r6 13 0.052 252

2.3 Attention check

pt %>% 
  filter(!is.na(scale)) %>%  # remove those not assigned to scale condition
  group_by(scale) %>% 
  summarise(ac_fail = sum(ac == F, na.rm = T),
            prop_ac_fail = (sum(ac == F, na.rm = T) / n()),
            Total = n()) %>% 
  kbl(digits = 3, caption = "Failed attention checks by response condition") %>% 
  kable_styling(bootstrap_options = c("striped", "bordered"))
Table 2.2: Failed attention checks by response condition
scale ac_fail prop_ac_fail Total
r12 0 0.000 98
r4 0 0.000 99
r6 3 0.031 98

2.4 Hypothesis group 1 model (main effects of experimental factors only)

2.4.1 Balance of experimental factors

resp4_bal <- select(resp4, ends_with("_v"))
resp6_bal <- select(resp6, ends_with("_v"))
resp12_bal <- select(resp12, ends_with("_v"))
print(dfSummary(resp4_bal, graph.magnif = 0.75), method = 'render',
      valid.col = FALSE, na.col = FALSE)

Data Frame Summary

resp4_bal

Dimensions: 305 x 6
Duplicates: 100
No Variable Stats / Values Freqs (% of Valid) Graph
1 gender_v [factor] 1. female 2. male
154(50.5%)
151(49.5%)
2 age_v [integer] Mean (sd) : 4.5 (2.2) min < med < max: 1 < 5 < 8 IQR (CV) : 3 (0.5)
1:35(11.5%)
2:36(11.8%)
3:42(13.8%)
4:34(11.2%)
5:44(14.4%)
6:41(13.4%)
7:37(12.1%)
8:36(11.8%)
3 work_v [factor] 1. health_wrk 2. delivery_wrk 3. social_wrk 4. unemployed
80(26.2%)
75(24.6%)
75(24.6%)
75(24.6%)
4 care_v [factor] 1. no_care 2. elder_care
155(50.8%)
150(49.2%)
5 country_v [factor] 1. Chile 2. Venezuela 3. Haití 4. España
76(24.9%)
77(25.2%)
79(25.9%)
73(23.9%)
6 comorb_v [factor] 1. no_comorbs 2. diabetes 3. obesity 4. cancer
74(24.3%)
77(25.2%)
78(25.6%)
76(24.9%)
print(dfSummary(resp6_bal, graph.magnif = 0.75), method = 'render',
      valid.col = FALSE, na.col = FALSE)

Data Frame Summary

resp6_bal

Dimensions: 252 x 6
Duplicates: 61
No Variable Stats / Values Freqs (% of Valid) Graph
1 gender_v [factor] 1. female 2. male
129(51.2%)
123(48.8%)
2 age_v [integer] Mean (sd) : 4.4 (2.3) min < med < max: 1 < 4 < 8 IQR (CV) : 4 (0.5)
1:36(14.3%)
2:31(12.3%)
3:30(11.9%)
4:30(11.9%)
5:33(13.1%)
6:30(11.9%)
7:30(11.9%)
8:32(12.7%)
3 work_v [factor] 1. health_wrk 2. delivery_wrk 3. social_wrk 4. unemployed
63(25.0%)
64(25.4%)
62(24.6%)
63(25.0%)
4 care_v [factor] 1. no_care 2. elder_care
126(50.0%)
126(50.0%)
5 country_v [factor] 1. Chile 2. Venezuela 3. Haití 4. España
62(24.6%)
62(24.6%)
63(25.0%)
65(25.8%)
6 comorb_v [factor] 1. no_comorbs 2. diabetes 3. obesity 4. cancer
62(24.6%)
65(25.8%)
61(24.2%)
64(25.4%)
print(dfSummary(resp12_bal, graph.magnif = 0.75), method = 'render',
      valid.col = FALSE, na.col = FALSE)

Data Frame Summary

resp12_bal

Dimensions: 230 x 6
Duplicates: 46
No Variable Stats / Values Freqs (% of Valid) Graph
1 gender_v [factor] 1. female 2. male
117(50.9%)
113(49.1%)
2 age_v [integer] Mean (sd) : 4.5 (2.3) min < med < max: 1 < 5 < 8 IQR (CV) : 5 (0.5)
1:31(13.5%)
2:28(12.2%)
3:25(10.9%)
4:26(11.3%)
5:30(13.0%)
6:30(13.0%)
7:32(13.9%)
8:28(12.2%)
3 work_v [factor] 1. health_wrk 2. delivery_wrk 3. social_wrk 4. unemployed
58(25.2%)
58(25.2%)
56(24.3%)
58(25.2%)
4 care_v [factor] 1. no_care 2. elder_care
115(50.0%)
115(50.0%)
5 country_v [factor] 1. Chile 2. Venezuela 3. Haití 4. España
57(24.8%)
57(24.8%)
59(25.7%)
57(24.8%)
6 comorb_v [factor] 1. no_comorbs 2. diabetes 3. obesity 4. cancer
58(25.2%)
56(24.3%)
58(25.2%)
58(25.2%)

2.4.2 Models

# Model with vignette main factors
pred_f <- as.formula("just_vac_n ~ gender_v + age_v + work_v + country_v + 
                     care_v + comorb_v +
                     (1 | ResponseId)")
# Models
mr4 <- resp4 %>% 
  lmer(pred_f, data = .)

mr4ac <- resp4 %>% 
  filter(ac == T) %>% 
  lmer(pred_f, data = .)

mr6 <- resp6 %>% 
  lmer(pred_f, data = .)

mr6ac <- resp6 %>% 
  filter(ac == T) %>% 
  lmer(pred_f, data = .)

mr12 <- resp12 %>% 
  lmer(pred_f, data = .)

mr12ac <- resp12 %>% 
  filter(ac == T) %>% 
  lmer(pred_f, data = .)
tab_model(mr4ac, mr6ac, mr12ac,
          dv.labels = c("Trimester", "Bimester", "Month"),
          title = "Models for attentive respondents",
          digits = 1, digits.p = 2)
Models for attentive respondents
  Trimester Bimester Month
Predictors Estimates CI p Estimates CI p Estimates CI p
(Intercept) 3.2 2.8 – 3.5 <0.001 4.8 4.2 – 5.3 <0.001 10.1 9.2 – 10.9 <0.001
gender_v [male] -0.1 -0.3 – 0.1 0.22 -0.1 -0.3 – 0.2 0.71 -0.1 -0.5 – 0.3 0.64
age_v 0.1 0.0 – 0.1 <0.001 0.1 0.0 – 0.1 0.01 0.1 0.0 – 0.2 0.03
work_v [delivery_wrk] -0.5 -0.7 – -0.3 <0.001 -0.8 -1.1 – -0.4 <0.001 -1.5 -2.1 – -0.9 <0.001
work_v [social_wrk] -0.7 -0.9 – -0.4 <0.001 -0.7 -1.1 – -0.3 <0.001 -1.3 -1.9 – -0.7 <0.001
work_v [unemployed] -0.7 -0.9 – -0.5 <0.001 -0.7 -1.1 – -0.3 <0.001 -1.9 -2.5 – -1.3 <0.001
country_v [Venezuela] 0.0 -0.2 – 0.3 0.86 0.3 -0.1 – 0.7 0.21 -0.2 -0.8 – 0.4 0.46
country_v [Haití] 0.0 -0.2 – 0.3 0.85 -0.2 -0.6 – 0.2 0.36 0.1 -0.5 – 0.7 0.79
country_v [España] -0.1 -0.4 – 0.1 0.28 -0.1 -0.5 – 0.3 0.59 0.0 -0.6 – 0.6 0.98
care_v [elder_care] 0.4 0.2 – 0.6 <0.001 0.3 0.0 – 0.6 0.03 0.7 0.3 – 1.1 <0.001
comorb_v [diabetes] 0.3 0.1 – 0.6 0.01 0.7 0.3 – 1.1 <0.001 1.1 0.5 – 1.7 <0.001
comorb_v [obesity] 0.5 0.3 – 0.7 <0.001 0.3 -0.1 – 0.8 0.09 0.9 0.3 – 1.5 <0.001
comorb_v [cancer] 0.5 0.3 – 0.7 <0.001 0.9 0.5 – 1.3 <0.001 1.5 0.9 – 2.1 <0.001
Random Effects
σ2 0.47 1.06 2.20
τ00 0.20 ResponseId 0.17 ResponseId 0.51 ResponseId
ICC 0.30 0.14 0.19
N 65 ResponseId 54 ResponseId 51 ResponseId
Observations 258 211 198
Marginal R2 / Conditional R2 0.216 / 0.452 0.223 / 0.330 0.263 / 0.403
tab_model(mr4, mr6, mr12,
          dv.labels = c("Trimester", "Bimester", "Month"),
          title = "Models for full sample",
          digits = 1, digits.p = 2)
Models for full sample
  Trimester Bimester Month
Predictors Estimates CI p Estimates CI p Estimates CI p
(Intercept) 3.2 2.8 – 3.5 <0.001 4.8 4.2 – 5.3 <0.001 10.4 9.5 – 11.3 <0.001
gender_v [male] -0.1 -0.2 – 0.1 0.28 0.0 -0.2 – 0.3 0.83 -0.1 -0.6 – 0.3 0.54
age_v 0.1 0.0 – 0.1 <0.001 0.1 0.0 – 0.1 0.01 0.1 -0.0 – 0.2 0.16
work_v [delivery_wrk] -0.5 -0.8 – -0.3 <0.001 -0.7 -1.1 – -0.3 <0.001 -1.3 -1.9 – -0.7 <0.001
work_v [social_wrk] -0.7 -0.9 – -0.5 <0.001 -0.6 -1.0 – -0.3 <0.001 -1.4 -2.0 – -0.8 <0.001
work_v [unemployed] -0.7 -0.9 – -0.4 <0.001 -0.8 -1.2 – -0.4 <0.001 -1.8 -2.4 – -1.2 <0.001
country_v [Venezuela] -0.1 -0.3 – 0.1 0.50 0.3 -0.1 – 0.7 0.10 -0.4 -1.0 – 0.2 0.18
country_v [Haití] -0.0 -0.3 – 0.2 0.79 -0.2 -0.6 – 0.2 0.31 -0.0 -0.7 – 0.6 0.93
country_v [España] -0.1 -0.4 – 0.1 0.25 -0.1 -0.5 – 0.3 0.57 -0.0 -0.7 – 0.6 0.91
care_v [elder_care] 0.4 0.2 – 0.5 <0.001 0.3 0.0 – 0.5 0.05 0.7 0.3 – 1.2 <0.001
comorb_v [diabetes] 0.4 0.2 – 0.6 <0.001 0.6 0.3 – 1.0 <0.001 1.1 0.4 – 1.7 <0.001
comorb_v [obesity] 0.5 0.3 – 0.7 <0.001 0.3 -0.0 – 0.7 0.07 0.7 0.1 – 1.3 0.03
comorb_v [cancer] 0.6 0.3 – 0.8 <0.001 0.9 0.5 – 1.3 <0.001 1.4 0.8 – 2.1 <0.001
Random Effects
σ2 0.45 1.02 2.66
τ00 0.18 ResponseId 0.16 ResponseId 0.44 ResponseId
ICC 0.29 0.14 0.14
N 73 ResponseId 61 ResponseId 55 ResponseId
Observations 289 239 214
Marginal R2 / Conditional R2 0.225 / 0.447 0.217 / 0.326 0.225 / 0.334

2.4.3 Bayes models

f_hg1 <- as.formula("just_vac_n ~ gender_v + age_v + work_v + country_v + 
                     care_v + comorb_v +
                     (1 | ResponseId)")
## Priors
priors_hg1 <- c(set_prior("student_t(3, 5.2, 1)", class = "Intercept"),
                set_prior("student_t(3, 0, 10)", class = "b"),
                set_prior("student_t(3, 0, 3)", class = "sd"))

resp6ac <- resp6 %>% 
  filter(ac == T)
m1 <- brm(f_hg1, 
          data = resp6ac,
          prior = priors_hg1, 
          iter = 25000,
          control = list(adapt_delta = .9),
          save_pars = save_pars(all = T),
          refresh = 0)
summary(m1)
##  Family: gaussian 
##   Links: mu = identity; sigma = identity 
## Formula: just_vac_n ~ gender_v + age_v + work_v + country_v + care_v + comorb_v + (1 | ResponseId) 
##    Data: resp6ac (Number of observations: 211) 
## Samples: 4 chains, each with iter = 25000; warmup = 12500; thin = 1;
##          total post-warmup samples = 50000
## 
## Group-Level Effects: 
## ~ResponseId (Number of levels: 54) 
##               Estimate Est.Error l-95% CI u-95% CI Rhat Bulk_ESS Tail_ESS
## sd(Intercept)     0.38      0.14     0.07     0.63 1.00     9748    11455
## 
## Population-Level Effects: 
##                    Estimate Est.Error l-95% CI u-95% CI Rhat Bulk_ESS Tail_ESS
## Intercept              4.75      0.30     4.18     5.33 1.00    54777    38268
## gender_vmale          -0.05      0.15    -0.34     0.24 1.00    78691    38172
## age_v                  0.08      0.03     0.02     0.15 1.00    75438    38567
## work_vdelivery_wrk    -0.75      0.20    -1.15    -0.35 1.00    54208    40919
## work_vsocial_wrk      -0.66      0.21    -1.07    -0.26 1.00    54065    39881
## work_vunemployed      -0.74      0.21    -1.15    -0.33 1.00    53496    38874
## country_vVenezuela     0.26      0.21    -0.16     0.69 1.00    54822    41623
## country_vHaití        -0.18      0.21    -0.59     0.22 1.00    53363    39925
## country_vEspaña       -0.11      0.20    -0.51     0.29 1.00    54376    40812
## care_velder_care       0.31      0.15     0.02     0.60 1.00    84124    36515
## comorb_vdiabetes       0.71      0.21     0.30     1.12 1.00    52532    38755
## comorb_vobesity        0.35      0.21    -0.07     0.76 1.00    56252    42094
## comorb_vcancer         0.92      0.21     0.52     1.32 1.00    54037    41688
## 
## Family Specific Parameters: 
##       Estimate Est.Error l-95% CI u-95% CI Rhat Bulk_ESS Tail_ESS
## sigma     1.05      0.06     0.93     1.18 1.00    22364    31601
## 
## Samples were drawn using sampling(NUTS). For each parameter, Bulk_ESS
## and Tail_ESS are effective sample size measures, and Rhat is the potential
## scale reduction factor on split chains (at convergence, Rhat = 1).
sesoi <- c(-.115, .115) # one-week for bimonthly answers
bf_m1a <- bayesfactor_parameters(m1, null = sesoi, direction = "right")
bf_m1b <- bayesfactor_parameters(m1, null = sesoi, direction = "two-sided")
### Country
pairs_country_v <- pairs(emmeans(m1, ~country_v))
bf_m1_cntry_v <- bayesfactor_parameters(pairs_country_v, m1, 
                                      null = sesoi, direction = "two-sided")
pairs_work_v <- pairs(emmeans(m1, ~work_v))
bf_m1_work_v <- bayesfactor_parameters(pairs_work_v, m1, 
                                       null = sesoi, direction = "right")

pairs_comorb_v <- pairs(emmeans(m1, ~comorb_v))
bf_m1_comorb_v <- bayesfactor_parameters(pairs_comorb_v, m1, 
                                      null = sesoi, direction = "left")

pairs_country_v
##  contrast           estimate lower.HPD upper.HPD
##  Chile - Venezuela   -0.2617   -0.6900     0.152
##  Chile - Haití        0.1842   -0.2140     0.601
##  Chile - España       0.1079   -0.2836     0.513
##  Venezuela - Haití    0.4460    0.0292     0.856
##  Venezuela - España   0.3682   -0.0381     0.780
##  Haití - España      -0.0775   -0.4735     0.323
## 
## Point estimate displayed: median 
## HPD interval probability: 0.95
pairs_work_v
##  contrast                  estimate lower.HPD upper.HPD
##  health_wrk - delivery_wrk   0.7527     0.355     1.154
##  health_wrk - social_wrk     0.6627     0.272     1.079
##  health_wrk - unemployed     0.7396     0.331     1.154
##  delivery_wrk - social_wrk  -0.0905    -0.493     0.312
##  delivery_wrk - unemployed  -0.0136    -0.412     0.405
##  social_wrk - unemployed     0.0753    -0.329     0.488
## 
## Point estimate displayed: median 
## HPD interval probability: 0.95
pairs_comorb_v
##  contrast              estimate lower.HPD upper.HPD
##  no_comorbs - diabetes   -0.709    -1.124   -0.3088
##  no_comorbs - obesity    -0.346    -0.754    0.0705
##  no_comorbs - cancer     -0.919    -1.329   -0.5263
##  diabetes - obesity       0.362    -0.051    0.7749
##  diabetes - cancer       -0.212    -0.616    0.1987
##  obesity - cancer        -0.574    -0.991   -0.1602
## 
## Point estimate displayed: median 
## HPD interval probability: 0.95
# Custom BF table
bf1_alt1 <- as.data.frame(bf_m1a) %>% 
  filter(!grepl("tercept|country|gender|work|comorb", Parameter)) %>% 
  mutate(Test = "Greater than")
bf1_alt2 <- as.data.frame(bf_m1_work_v) %>% 
  mutate(Test = "Greather than")
bf1_alt3 <- as.data.frame(bf_m1_comorb_v) %>% 
  mutate(Test = "Lesser than")
bf1_nul1 <- as.data.frame(bf_m1b) %>% 
  filter(grepl("female", Parameter)) %>% 
  mutate(Test = "Two-sided")
bf1_nul2 <- as.data.frame(bf_m1_cntry_v) %>% 
  mutate(Test = "Two-sided")

bf_sum <- bf1_alt1 %>% 
  bind_rows(bf1_nul1) %>% 
  select(Parameter, BF, Test) %>% 
  bind_rows(bf1_alt2, bf1_alt3, bf1_nul2) %>% 
  mutate(Null = "-0.115 - 0.115")

bf_sum <- bf_sum %>% 
  mutate(Result = case_when(
    grepl("than", Test) & BF > 10 ~ "Evidence for Ha",
    grepl("than", Test) & BF < 0.01 ~ "Evidence for H0",
    grepl("sided", Test) & BF < 0.01 ~ "Evidence for H0 ",
    grepl("sided", Test) & BF > 10 ~ "Evidence for Ha",
    BF >= 0.01 & BF  <= 10 ~ "Inconclusive",
    TRUE ~ NA_character_),
    Conclusion = case_when(
      grepl("than", Test) & BF > 10 ~ "Support for HG1",
      grepl("than", Test) & BF < 0.01 ~ "Contrary to HG1",
      grepl("sided", Test) & BF < 0.01 ~ "Support for HG1 ",
      grepl("sided", Test) & BF > 10 ~ "Contrary to HG1",
      BF >= 0.01 & BF  <= 10 ~ "--",
      TRUE ~ NA_character_)) %>% 
  mutate(BF = as.character(signif(BF, 2)))

bf_sum %>% 
  kbl(format = "html", digits = 3, escape = FALSE,
      caption = "Bayes factors and conclusion summary") %>%
  kable_styling(bootstrap_options = c("striped", "bordered")) %>% 
  footnote(general = paste0("BF: Bayes Factor; criteria for assessing evidence is", "$BF_{10} > 10$", " or ", "$BF_{10} < 0.01$; comparisons between levels are shown for factors with more than two levels."), 
           footnote_as_chunk = T, escape=F)
Table 2.3: Bayes factors and conclusion summary
Parameter BF Test Null Result Conclusion
b_age_v 0.0033 Greater than -0.115 - 0.115 Evidence for H0 Contrary to HG1
b_care_velder_care 0.17 Greater than -0.115 - 0.115 Inconclusive
health_wrk - delivery_wrk 20 Greather than -0.115 - 0.115 Evidence for Ha Support for HG1
health_wrk - social_wrk 4.5 Greather than -0.115 - 0.115 Inconclusive
health_wrk - unemployed 12 Greather than -0.115 - 0.115 Evidence for Ha Support for HG1
delivery_wrk - social_wrk 0.0043 Greather than -0.115 - 0.115 Evidence for H0 Contrary to HG1
delivery_wrk - unemployed 0.0068 Greather than -0.115 - 0.115 Evidence for H0 Contrary to HG1
social_wrk - unemployed 0.012 Greather than -0.115 - 0.115 Inconclusive
no_comorbs - diabetes 7.8 Lesser than -0.115 - 0.115 Inconclusive
no_comorbs - obesity 0.12 Lesser than -0.115 - 0.115 Inconclusive
no_comorbs - cancer 220 Lesser than -0.115 - 0.115 Evidence for Ha Support for HG1
diabetes - obesity 0.0011 Lesser than -0.115 - 0.115 Evidence for H0 Contrary to HG1
diabetes - cancer 0.028 Lesser than -0.115 - 0.115 Inconclusive
obesity - cancer 0.74 Lesser than -0.115 - 0.115 Inconclusive
Chile - Venezuela 0.032 Two-sided -0.115 - 0.115 Inconclusive
Chile - Haití 0.02 Two-sided -0.115 - 0.115 Inconclusive
Chile - España 0.014 Two-sided -0.115 - 0.115 Inconclusive
Venezuela - Haití 0.094 Two-sided -0.115 - 0.115 Inconclusive
Venezuela - España 0.049 Two-sided -0.115 - 0.115 Inconclusive
Haití - España 0.0078 Two-sided -0.115 - 0.115 Evidence for H0 Support for HG1
Note: BF: Bayes Factor; criteria for assessing evidence is\(BF_{10} &gt; 10\) or \(BF_{10} &lt; 0.01\); comparisons between levels are shown for factors with more than two levels.

2.5 Survey duration

pt %>% 
  filter(!is.na(scale), ac == T) %>%
  mutate(Duration = Duration..in.seconds./60) %>%
  select(scale, Duration) %>%
  stby(.$scale, descr, stats = "fivenum") %>%
  tb(order = 3) %>%
  kbl(format = "html", digits = 1,
      caption = "Duration of the survey in minutes (only passed attention checks)") %>%
  kable_styling(bootstrap_options = c("striped", "bordered")) %>%
  collapse_rows(columns = 1, valign = "top")
Table 2.4: Duration of the survey in minutes (only passed attention checks)
variable scale min q1 med q3 max
Duration r12 1.8 2.7 3.8 5.1 59.6
r4 1.7 2.6 3.4 4.3 8.0
r6 1.1 2.7 3.8 5.2 26.7
pt %>% 
  filter(!is.na(scale)) %>%
  mutate(Duration = Duration..in.seconds./60) %>%
  select(scale, Duration) %>%
  stby(.$scale, descr, stats = "fivenum") %>%
  tb(order = 3) %>%
  kbl(format = "html", digits = 1,
      caption = "Duration of the survey in minutes (for all valid responses)") %>%
  kable_styling(bootstrap_options = c("striped", "bordered")) %>%
  collapse_rows(columns = 1, valign = "top")
Table 2.5: Duration of the survey in minutes (for all valid responses)
variable scale min q1 med q3 max
Duration r12 0.1 1.1 2.7 4.6 59.6
r4 0.2 2.1 2.9 4.2 10.7
r6 0.1 1.1 2.7 4.3 26.7

2.6 Survey comments

pt %>%
  filter(!is.na(comment)) %>%
  select(scale, comment) %>%
  arrange(scale)  %>%
  kbl(caption = "Comments given at the end of pretest", 
      col.names = c("Response scale", "Comment"), row.names = T) %>% 
  kable_styling(bootstrap_options = c("striped", "bordered"))
Table 2.6: Comments given at the end of pretest
Response scale Comment
1 r12 Hola Valentina, me ha llegado esta encuesta por medio de mi madre. He encontrado que las preguntas fueron bien formuladas, me gustó tener que pensar y ponerme en la situación de catalogar y priorizar personas. Es algo que no hacemos día a día. Las preguntas son claras. Mi única mejora quizás podría ser dar rangos de tiempos en vez de mes por mes. Quizás cuartos de años o trimestres, ya que imagino o distribución normal de la gente no se hace mes. He compartido la encuesta con distintos amigos de la escuela y unos chilenos viviendo en Suecia. Ojalá te sirva, Te mando un gran abrazo y espero restablecer el contacto. Tal
2 r12 Las personas con enfermedades de base junto a los ancianos son los primeros que deben vacunarse.
3 r12 Por favor hagan algo con la gente que no cree en las vacunas,ojalá vacunarse fuera obligatorio
4 r12 Lo siento, pero como ya estamos en abril ,desestimé los primeros meses del año.
5 r12 Pienso q el corona virus es algo letal……pero quizas entra aqui la fe…..y exactamente las marcas de vacunas……no se sabe que fin tienen. Nosotros tenemos trombosis… 2 hermanos con esto y yo ya tengo la genetica….. Por mi parte no me la colocare……prefiero la antiinfluenza y neurobionta……..estas 2 vacunas he estado muy bien. 🙏
6 r12 Para que tantos datos ? Vacuna influenza no se pide datos solo edad,,, Hay poca información sobre eso ,,,anotan nuestros datos ,teléfono ,domicilio etc,dudosa actitud.necesitamos información.
7 r12 Las vacunas son necesarias pero nadie contrala las secuelas…tengo secuelas con la primera dosis y tengo miedo a la segunda dosis…informó el doc y dijo que me llamarian y no pasa nada y si voy a la segunda y me agravo? En Chile no se preocupan de las secuelas
8 r12 No he dado fechas de inoculación de las personas de los Ejemplos por que Nunca he estado de ACUERDO y ACEPTADO ÉSTE TRATAMIENTO. Tanto éstas Vacunas y las Mascarillas son una FALACIA Y UN GRAN DAÑO A LA HUMANIDAD.
9 r12 Para mi opinion x que no se vacuna a la poblacion en general contra el covid19 Para poder salir mas rapido de la pandemia Esa es mi opinion son ustedes lo que digan como se ase la vacunacion gracias x su atencion
10 r12 Es necesario que pongan la nacionalidad de las personas en el ejemplo?
11 r12 Quedate en casa
12 r12 Creo que debieron ser la misma cantidad de casos para la misma cantidad de meses, es decir, 12 casos para los 12 meses
13 r12

¿Cuál es el objeto de la encuesta (más allá del mismo estudio)?¿pretende influir en la opinión pública?

Saludos cordiales.
14 r4 Esta bien echa la encuesta.
15 r4 Necesarias no bajar la guardia..
16 r4 Que haremos con aquellos que no quieren vacunarse?
17 r4 Con la vacuna igual uno puede contagiarse o no
18 r4 Sesgadas
19 r4 No se
20 r4 Es preocupante que no se este considerando a niños, infantes y mujeres embarazadas en la vacuna. Tambien hay rumores de efectos o secuelas de la vacuna poco investigados e informados.
21 r4 Nunca me vacunare se de que se trata no.me presto.a ser parte del.circo
22 r4 X
23 r4 Que sirva
24 r4 Buenas preguntas y espero que también sean alcanzados los jóvenes y niños,y no bajar los brazos y a los de salud mucha fortaleza
25 r4 Cual es el objetivo de la nacionalidad no diferencias estadistica y epidimiologica entre los diferentes paises
26 r4 Bueno, pienso que este virus es peligroso, aun siendo asi, no me vacune, quizas mas adelante cuando las vacunas sean mas completas.
27 r4 Me llamo la atención que no hubiera consentimiento informado
28 r6 Cómo puedo solicitar la vacuna para mi esposo de 90 años y para mí ( 74 ) a domicilio?
29 r6 Más casos
30 r6 Espero que se logre vacunar a todos lo antes posible.
31 r6 No gracias
32 r6 Experimento con las vacunas , nada certificada , harto penca somos para encontrar alguna cura
33 r6 No me parece que mencionen la nacionalidad de los posibles vacunantes. Me carga
34 r6 Ningún comentario
35 r6 Lis casos que ustedes plantearon al principio de la encuesta, son todos prioritarios para mi,
36 r6 Hay que vacunar más rápido y lograr que el grupo de 40 a 18 años pronto estén vacunados don los que más desobedecen
37 r6 ninguno
38 r6 Quien ocupará está muestra? Será para mejorar el sistema ?
39 r6 Dar prioridad en la vacunacion al personal de salud, FFAA de orden y seguridad. Los políticos para el final, con suerte los vacunaria el31 de diciembre
40 r6 Se asume q el inmigrante esta con documentos legales
41 r6

todos los casos presentados según mi criterio eran de alto riesgo.

pregunta la vacuna en ambas dosis me dejó con sueño , cefalea por un par de días, no será muy pronto ponerse la antiinfluenza, pienso que mi sistema inmune debe estar agotado.
42 r6 No, está bien.
43 r6 Distancia de la vacuna covid19 y la vacuna antigripal esa que ponen en invierno.. Cúal es la diferencia de tiempo para ponérse la una y la otra .??