library(readxl)
kap <- read_excel("D:/KDCA SAU/KAP Analysis/manuscript/kap_data.xlsx")
library(gtsummary)
library(dplyr)
library(gtsummary)
library(purrr)
library(tidyr)
kap |> tbl_summary(include = c(age_cat, gender, education, profession, division,experience_yr,livestock_number))
| Characteristic |
N = 206 |
| age_cat |
|
| >60 |
34 (17%) |
| 18–29 |
25 (12%) |
| 30–44 |
75 (36%) |
| 45–59 |
72 (35%) |
| gender |
|
| female |
36 (17%) |
| male |
170 (83%) |
| education |
|
| higher secondary or above |
33 (16%) |
| illiterate |
34 (17%) |
| primary |
62 (30%) |
| secondary |
77 (37%) |
| profession |
|
| businessman |
35 (17%) |
| day labour |
5 (2.4%) |
| farmer |
120 (58%) |
| house wife |
30 (15%) |
| job holder |
10 (4.9%) |
| student |
6 (2.9%) |
| division |
|
| Chattogram |
34 (17%) |
| Dhaka |
18 (8.7%) |
| Khulna |
22 (11%) |
| Mymensingh |
32 (16%) |
| Rajshahi |
25 (12%) |
| Rangpur |
22 (11%) |
| Sylhet |
53 (26%) |
| experience_yr |
|
| 1 to 5 |
73 (35%) |
| 6 to 10 |
45 (22%) |
| More than 10 |
88 (43%) |
| livestock_number |
|
| 1 to 5 |
94 (46%) |
| 6 to 10 |
58 (28%) |
| More than 11 |
54 (26%) |
#Animal type
animal_counts <- kap %>%
select(livestoct_types) %>%
separate_rows(livestoct_types, sep = ",\\s*") %>%
group_by(livestoct_types) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / 206) * 100, 1), # assuming N = 206
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
##print table
animal_counts %>%
select(Animal = livestoct_types, Count = count, `Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 8 × 3
## Animal Count `Percentage (%)`
## <chr> <int> <chr>
## 1 cattle 187 90.8%
## 2 poultry 75 36.4%
## 3 goat 57 27.7%
## 4 buffalo 13 6.3%
## 5 sheep 9 4.4%
## 6 other poultry 5 2.4%
## 7 horse 1 0.5%
## 8 rabbit 1 0.5%
#purpose by animal
# Filter respondents who own any of the specified animals
kap_filtered <- kap %>%
filter(grepl("cattle|goat|buffalo|sheep|horse|rabbit", livestoct_types, ignore.case = TRUE))
#Separate the 'purpose' column, count, and calculate percentage
purpose_counts_filtered <- kap_filtered %>%
select(purpose) %>%
separate_rows(purpose, sep = ",\\s*") %>%
group_by(purpose) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / nrow(kap_filtered)) * 100, 1),
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
# Print the table
purpose_counts_filtered %>%
select(Purpose = purpose, Count = count, `Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 6 × 3
## Purpose Count `Percentage (%)`
## <chr> <int> <chr>
## 1 sell 122 60.4%
## 2 milk 119 58.9%
## 3 meat 55 27.2%
## 4 work 14 6.9%
## 5 egg 3 1.5%
## 6 ai 1 0.5%
#vector knowledge
vector_counts <- kap %>%
select(parasitic_vectors) %>%
separate_rows(parasitic_vectors, sep = ",\\s*") %>% # separate by comma and space
group_by(parasitic_vectors) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / 206) * 100, 1),
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
# Print the table
vector_counts %>%
select(`Parasitic Vector` = parasitic_vectors, Count = count, `Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 5 × 3
## `Parasitic Vector` Count `Percentage (%)`
## <chr> <int> <chr>
## 1 Flies 136 66%
## 2 Mosquitoes 105 51%
## 3 Lice 45 21.8%
## 4 Ticks 35 17%
## 5 Dont know 32 15.5%
#sign knowledge
sign_counts <- kap %>%
select(sign) %>%
separate_rows(sign, sep = ",\\s*") %>%
group_by(sign) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / 206) * 100, 1),
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
# Print the table
sign_counts %>%
select(`Clinical Sign` = sign, Count = count, `Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 7 × 3
## `Clinical Sign` Count `Percentage (%)`
## <chr> <int> <chr>
## 1 "milk production loss" 65 31.6%
## 2 "weight loss " 60 29.1%
## 3 "fever" 59 28.6%
## 4 "diarrhoea" 50 24.3%
## 5 "dont know" 37 18%
## 6 "weight loss" 32 15.5%
## 7 "anemia" 23 11.2%
#knowledge of zoonotic disease
kap |> tbl_summary(include = c(zoonotic_awarenes, para_zoonotic_knowledge))
| Characteristic |
N = 206 |
| zoonotic_awarenes |
112 (54%) |
| para_zoonotic_knowledge |
|
| dont know |
81 (39%) |
| no |
21 (10%) |
| yes |
104 (50%) |
#Factors influencing knowledge about zoonotic diseases (n = 206).
kap %>%
select(zoonotic_awarenes, gender, age_cat, education, division, experience_yr, profession
) %>%
tbl_summary(
by = zoonotic_awarenes, # Stratify by knowledge
statistic = all_categorical() ~ "{n} ({p}%)",
missing = "no"
) %>%
add_p(test = all_categorical() ~ "chisq.test") %>% # Add p-values
bold_labels() %>%
modify_caption("**Factors influencing knowledge about zoonotic diseases (n = 206).**")
Factors influencing knowledge about zoonotic diseases (n = 206).
| Characteristic |
no
N = 94 |
yes
N = 112 |
p-value |
| gender |
|
|
0.3 |
| female |
20 (21%) |
16 (14%) |
|
| male |
74 (79%) |
96 (86%) |
|
| age_cat |
|
|
0.12 |
| >60 |
18 (19%) |
16 (14%) |
|
| 18–29 |
7 (7.4%) |
18 (16%) |
|
| 30–44 |
31 (33%) |
44 (39%) |
|
| 45–59 |
38 (40%) |
34 (30%) |
|
| education |
|
|
0.3 |
| higher secondary or above |
11 (12%) |
22 (20%) |
|
| illiterate |
18 (19%) |
16 (14%) |
|
| primary |
31 (33%) |
31 (28%) |
|
| secondary |
34 (36%) |
43 (38%) |
|
| division |
|
|
0.062 |
| Chattogram |
21 (22%) |
13 (12%) |
|
| Dhaka |
8 (8.5%) |
10 (8.9%) |
|
| Khulna |
12 (13%) |
10 (8.9%) |
|
| Mymensingh |
15 (16%) |
17 (15%) |
|
| Rajshahi |
14 (15%) |
11 (9.8%) |
|
| Rangpur |
9 (9.6%) |
13 (12%) |
|
| Sylhet |
15 (16%) |
38 (34%) |
|
| experience_yr |
|
|
0.2 |
| 1 to 5 |
33 (35%) |
40 (36%) |
|
| 6 to 10 |
16 (17%) |
29 (26%) |
|
| More than 10 |
45 (48%) |
43 (38%) |
|
| profession |
|
|
0.9 |
| businessman |
15 (16%) |
20 (18%) |
|
| day labour |
3 (3.2%) |
2 (1.8%) |
|
| farmer |
53 (56%) |
67 (60%) |
|
| house wife |
16 (17%) |
14 (13%) |
|
| job holder |
5 (5.3%) |
5 (4.5%) |
|
| student |
2 (2.1%) |
4 (3.6%) |
|
#Factors influencing knowledge about parasitic zoonotic diseases (n = 206).
kap %>%
select(para_zoonotic_knowledge, gender, age_cat, education, division, experience_yr, profession) %>%
tbl_summary(
by = para_zoonotic_knowledge, # Stratify by knowledge
statistic = all_categorical() ~ "{n} ({p}%)",
missing = "no"
) %>%
add_p(test = all_categorical() ~ "chisq.test") %>% # Add p-values
bold_labels() %>%
modify_caption("**Factors influencing knowledge about parasitic zoonotic diseases (n = 206).**")
Factors influencing knowledge about parasitic zoonotic diseases (n = 206).
| Characteristic |
dont know
N = 81 |
no
N = 21 |
yes
N = 104 |
p-value |
| gender |
|
|
|
0.024 |
| female |
21 (26%) |
4 (19%) |
11 (11%) |
|
| male |
60 (74%) |
17 (81%) |
93 (89%) |
|
| age_cat |
|
|
|
0.5 |
| >60 |
17 (21%) |
3 (14%) |
14 (13%) |
|
| 18–29 |
9 (11%) |
1 (4.8%) |
15 (14%) |
|
| 30–44 |
24 (30%) |
9 (43%) |
42 (40%) |
|
| 45–59 |
31 (38%) |
8 (38%) |
33 (32%) |
|
| education |
|
|
|
0.10 |
| higher secondary or above |
7 (8.6%) |
4 (19%) |
22 (21%) |
|
| illiterate |
16 (20%) |
2 (9.5%) |
16 (15%) |
|
| primary |
31 (38%) |
4 (19%) |
27 (26%) |
|
| secondary |
27 (33%) |
11 (52%) |
39 (38%) |
|
| division |
|
|
|
0.13 |
| Chattogram |
20 (25%) |
4 (19%) |
10 (9.6%) |
|
| Dhaka |
5 (6.2%) |
4 (19%) |
9 (8.7%) |
|
| Khulna |
8 (9.9%) |
2 (9.5%) |
12 (12%) |
|
| Mymensingh |
9 (11%) |
4 (19%) |
19 (18%) |
|
| Rajshahi |
13 (16%) |
2 (9.5%) |
10 (9.6%) |
|
| Rangpur |
10 (12%) |
2 (9.5%) |
10 (9.6%) |
|
| Sylhet |
16 (20%) |
3 (14%) |
34 (33%) |
|
| experience_yr |
|
|
|
0.7 |
| 1 to 5 |
24 (30%) |
8 (38%) |
41 (39%) |
|
| 6 to 10 |
21 (26%) |
4 (19%) |
20 (19%) |
|
| More than 10 |
36 (44%) |
9 (43%) |
43 (41%) |
|
| profession |
|
|
|
0.12 |
| businessman |
16 (20%) |
4 (19%) |
15 (14%) |
|
| day labour |
3 (3.7%) |
0 (0%) |
2 (1.9%) |
|
| farmer |
39 (48%) |
13 (62%) |
68 (65%) |
|
| house wife |
19 (23%) |
2 (9.5%) |
9 (8.7%) |
|
| job holder |
3 (3.7%) |
2 (9.5%) |
5 (4.8%) |
|
| student |
1 (1.2%) |
0 (0%) |
5 (4.8%) |
|
#Handling missing datas
kap$vaccine_effectiveness[kap$vaccine_effectiveness == "" | is.na(kap$vaccine_effectiveness)] <- "not effective"
kap$control_importance[kap$control_importance == "" | is.na(kap$control_importance)] <- "not important"
#Attitudes of the farmers to the parasitic disease
kap |> tbl_summary(include = c(disease_seriousness,control_importance,vaccine_effectiveness
))
| Characteristic |
N = 206 |
| disease_seriousness |
|
| dont know |
69 (33%) |
| no |
11 (5.3%) |
| yes |
126 (61%) |
| control_importance |
|
| imporatnt |
41 (20%) |
| not important |
2 (1.0%) |
| very important |
163 (79%) |
| vaccine_effectiveness |
|
| fairly effective |
61 (30%) |
| not effective |
8 (3.9%) |
| very effective |
137 (67%) |
#Practices of the farmers to the parasitic disease
kap |> tbl_summary(include = c( housing_cleanliness, contact_hygiene_farmer
))
| Characteristic |
N = 206 |
| housing_cleanliness |
|
| regularly |
180 (87%) |
| sometimes |
26 (13%) |
| contact_hygiene_farmer |
|
| no |
17 (8.3%) |
| soemetimes |
48 (23%) |
| yes |
141 (68%) |
#unique control measures
control_counts <- kap %>%
select(control_method) %>%
separate_rows(control_method, sep = ",\\s*") %>% # split by comma and space
group_by(control_method) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / 206) * 100, 1), # 206 is total respondents
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
# Print the table
control_counts %>%
select(`Control Method` = control_method, Count = count, `Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 4 × 3
## `Control Method` Count `Percentage (%)`
## <chr> <int> <chr>
## 1 ask vet 127 61.7%
## 2 deworm regularly 88 42.7%
## 3 kill vector 44 21.4%
## 4 nothing 17 8.3%
#unique treament source
treatment_counts <- kap %>%
select(treatment_source) %>%
separate_rows(treatment_source, sep = ",\\s*") %>% # split by comma and optional space
group_by(treatment_source) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / 206) * 100, 1),
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
# Print the table
treatment_counts %>%
select(`Treatment Source` = treatment_source, Count = count, `Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 4 × 3
## `Treatment Source` Count `Percentage (%)`
## <chr> <int> <chr>
## 1 vet 141 68.4%
## 2 medicine seller 53 25.7%
## 3 own idea 36 17.5%
## 4 other farmers 18 8.7%
#protection_count
protection_counts <- kap %>%
select(personal_protection_measures) %>%
separate_rows(personal_protection_measures, sep = ",\\s*") %>%
group_by(personal_protection_measures) %>%
summarise(count = n()) %>%
mutate(
percentage = round((count / 206) * 100, 1),
percentage_label = paste0(percentage, "%")
) %>%
arrange(desc(count))
# Print the table
protection_counts %>%
select(`Protection Measure` = personal_protection_measures,
Count = count,
`Percentage (%)` = percentage_label) %>%
print(n = Inf)
## # A tibble: 4 × 3
## `Protection Measure` Count `Percentage (%)`
## <chr> <int> <chr>
## 1 clean shed 167 81.1%
## 2 regular check-up 27 13.1%
## 3 nothing 23 11.2%
## 4 use gloves/mask 10 4.9%
#Relationships between knowledge and practices
#Create binary columns
kap <- kap %>%
mutate(
# Treatment sources
uses_vet = if_else(grepl("vet", treatment_source, ignore.case = TRUE), "Yes", "No"),
uses_medicine_seller = if_else(grepl("medicine", treatment_source, ignore.case = TRUE), "Yes", "No"),
uses_farmer = if_else(grepl("farmer", treatment_source, ignore.case = TRUE), "Yes", "No"),
uses_own_idea = if_else(grepl("own", treatment_source, ignore.case = TRUE), "Yes", "No"),
# Control methods
any_control_method = if_else(grepl("nothing", control_method, ignore.case = TRUE), "No", "Yes"),
ask_vet = if_else(grepl("vet", control_method, ignore.case = TRUE), "Yes", "No"),
control_vector = if_else(grepl("vector", control_method, ignore.case = TRUE), "Yes", "No"),
deworming = if_else(grepl("deworm", control_method, ignore.case = TRUE), "Yes", "No"),
# Personal protection
any_personal_protection = if_else(grepl("nothing", personal_protection_measures, ignore.case = TRUE), "No", "Yes"),
gloves = if_else(grepl("gloves", personal_protection_measures, ignore.case = TRUE), "Yes", "No"),
regular = if_else(grepl("regular", personal_protection_measures, ignore.case = TRUE), "Yes", "No"),
clean_shed = if_else(grepl("clean", personal_protection_measures, ignore.case = TRUE), "Yes", "No")
)
#Define all practice variables and outcomes
practice_vars <- c(
"uses_vet", "uses_medicine_seller", "uses_farmer", "uses_own_idea",
"any_control_method", "ask_vet", "control_vector", "deworming",
"any_personal_protection", "gloves", "regular", "clean_shed"
)
outcome_vars <- c("para_zoonotic_knowledge", "zoonotic_awarenes")
#Create all pairwise combinations
combinations <- expand.grid(practice = practice_vars, outcome = outcome_vars, stringsAsFactors = FALSE)
#Loop through combinations and generate cross-tab tables
cross_tables <- map2(
combinations$practice, combinations$outcome,
~ kap %>%
select(all_of(c(.x, .y))) %>%
tbl_cross(row = all_of(.x), col = all_of(.y), percent = "row") %>%
add_p() %>%
bold_labels() %>%
modify_caption(paste0("**", .x, " vs. ", .y, "**"))
)
#View all tables
cross_tables
## [[1]]
## <div id="qkxfvcfkdb" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#qkxfvcfkdb table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #qkxfvcfkdb thead, #qkxfvcfkdb tbody, #qkxfvcfkdb tfoot, #qkxfvcfkdb tr, #qkxfvcfkdb td, #qkxfvcfkdb th {
## border-style: none;
## }
##
## #qkxfvcfkdb p {
## margin: 0;
## padding: 0;
## }
##
## #qkxfvcfkdb .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #qkxfvcfkdb .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #qkxfvcfkdb .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #qkxfvcfkdb .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #qkxfvcfkdb .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #qkxfvcfkdb .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #qkxfvcfkdb .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #qkxfvcfkdb .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #qkxfvcfkdb .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #qkxfvcfkdb .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #qkxfvcfkdb .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #qkxfvcfkdb .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #qkxfvcfkdb .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #qkxfvcfkdb .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #qkxfvcfkdb .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qkxfvcfkdb .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #qkxfvcfkdb .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #qkxfvcfkdb .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #qkxfvcfkdb .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qkxfvcfkdb .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #qkxfvcfkdb .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qkxfvcfkdb .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #qkxfvcfkdb .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qkxfvcfkdb .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #qkxfvcfkdb .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qkxfvcfkdb .gt_left {
## text-align: left;
## }
##
## #qkxfvcfkdb .gt_center {
## text-align: center;
## }
##
## #qkxfvcfkdb .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #qkxfvcfkdb .gt_font_normal {
## font-weight: normal;
## }
##
## #qkxfvcfkdb .gt_font_bold {
## font-weight: bold;
## }
##
## #qkxfvcfkdb .gt_font_italic {
## font-style: italic;
## }
##
## #qkxfvcfkdb .gt_super {
## font-size: 65%;
## }
##
## #qkxfvcfkdb .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #qkxfvcfkdb .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #qkxfvcfkdb .gt_indent_1 {
## text-indent: 5px;
## }
##
## #qkxfvcfkdb .gt_indent_2 {
## text-indent: 10px;
## }
##
## #qkxfvcfkdb .gt_indent_3 {
## text-indent: 15px;
## }
##
## #qkxfvcfkdb .gt_indent_4 {
## text-indent: 20px;
## }
##
## #qkxfvcfkdb .gt_indent_5 {
## text-indent: 25px;
## }
##
## #qkxfvcfkdb .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #qkxfvcfkdb div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_vet vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_vet</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.10</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">32 (49%)</td>
## <td headers="stat_2" class="gt_row gt_center">4 (6.2%)</td>
## <td headers="stat_3" class="gt_row gt_center">29 (45%)</td>
## <td headers="stat_0" class="gt_row gt_center">65 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">49 (35%)</td>
## <td headers="stat_2" class="gt_row gt_center">17 (12%)</td>
## <td headers="stat_3" class="gt_row gt_center">75 (53%)</td>
## <td headers="stat_0" class="gt_row gt_center">141 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[2]]
## <div id="bivhwfzbkk" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#bivhwfzbkk table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #bivhwfzbkk thead, #bivhwfzbkk tbody, #bivhwfzbkk tfoot, #bivhwfzbkk tr, #bivhwfzbkk td, #bivhwfzbkk th {
## border-style: none;
## }
##
## #bivhwfzbkk p {
## margin: 0;
## padding: 0;
## }
##
## #bivhwfzbkk .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #bivhwfzbkk .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #bivhwfzbkk .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #bivhwfzbkk .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #bivhwfzbkk .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #bivhwfzbkk .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #bivhwfzbkk .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #bivhwfzbkk .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #bivhwfzbkk .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #bivhwfzbkk .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #bivhwfzbkk .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #bivhwfzbkk .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #bivhwfzbkk .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #bivhwfzbkk .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #bivhwfzbkk .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #bivhwfzbkk .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #bivhwfzbkk .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #bivhwfzbkk .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #bivhwfzbkk .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #bivhwfzbkk .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #bivhwfzbkk .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #bivhwfzbkk .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #bivhwfzbkk .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #bivhwfzbkk .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #bivhwfzbkk .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #bivhwfzbkk .gt_left {
## text-align: left;
## }
##
## #bivhwfzbkk .gt_center {
## text-align: center;
## }
##
## #bivhwfzbkk .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #bivhwfzbkk .gt_font_normal {
## font-weight: normal;
## }
##
## #bivhwfzbkk .gt_font_bold {
## font-weight: bold;
## }
##
## #bivhwfzbkk .gt_font_italic {
## font-style: italic;
## }
##
## #bivhwfzbkk .gt_super {
## font-size: 65%;
## }
##
## #bivhwfzbkk .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #bivhwfzbkk .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #bivhwfzbkk .gt_indent_1 {
## text-indent: 5px;
## }
##
## #bivhwfzbkk .gt_indent_2 {
## text-indent: 10px;
## }
##
## #bivhwfzbkk .gt_indent_3 {
## text-indent: 15px;
## }
##
## #bivhwfzbkk .gt_indent_4 {
## text-indent: 20px;
## }
##
## #bivhwfzbkk .gt_indent_5 {
## text-indent: 25px;
## }
##
## #bivhwfzbkk .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #bivhwfzbkk div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_medicine_seller vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_medicine_seller</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.5</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">57 (37%)</td>
## <td headers="stat_2" class="gt_row gt_center">15 (9.8%)</td>
## <td headers="stat_3" class="gt_row gt_center">81 (53%)</td>
## <td headers="stat_0" class="gt_row gt_center">153 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">24 (45%)</td>
## <td headers="stat_2" class="gt_row gt_center">6 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">23 (43%)</td>
## <td headers="stat_0" class="gt_row gt_center">53 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[3]]
## <div id="fnxcvpbjhy" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#fnxcvpbjhy table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #fnxcvpbjhy thead, #fnxcvpbjhy tbody, #fnxcvpbjhy tfoot, #fnxcvpbjhy tr, #fnxcvpbjhy td, #fnxcvpbjhy th {
## border-style: none;
## }
##
## #fnxcvpbjhy p {
## margin: 0;
## padding: 0;
## }
##
## #fnxcvpbjhy .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #fnxcvpbjhy .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #fnxcvpbjhy .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #fnxcvpbjhy .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #fnxcvpbjhy .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #fnxcvpbjhy .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #fnxcvpbjhy .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #fnxcvpbjhy .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #fnxcvpbjhy .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #fnxcvpbjhy .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #fnxcvpbjhy .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #fnxcvpbjhy .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #fnxcvpbjhy .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #fnxcvpbjhy .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #fnxcvpbjhy .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #fnxcvpbjhy .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #fnxcvpbjhy .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #fnxcvpbjhy .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #fnxcvpbjhy .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #fnxcvpbjhy .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #fnxcvpbjhy .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #fnxcvpbjhy .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #fnxcvpbjhy .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #fnxcvpbjhy .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #fnxcvpbjhy .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #fnxcvpbjhy .gt_left {
## text-align: left;
## }
##
## #fnxcvpbjhy .gt_center {
## text-align: center;
## }
##
## #fnxcvpbjhy .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #fnxcvpbjhy .gt_font_normal {
## font-weight: normal;
## }
##
## #fnxcvpbjhy .gt_font_bold {
## font-weight: bold;
## }
##
## #fnxcvpbjhy .gt_font_italic {
## font-style: italic;
## }
##
## #fnxcvpbjhy .gt_super {
## font-size: 65%;
## }
##
## #fnxcvpbjhy .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #fnxcvpbjhy .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #fnxcvpbjhy .gt_indent_1 {
## text-indent: 5px;
## }
##
## #fnxcvpbjhy .gt_indent_2 {
## text-indent: 10px;
## }
##
## #fnxcvpbjhy .gt_indent_3 {
## text-indent: 15px;
## }
##
## #fnxcvpbjhy .gt_indent_4 {
## text-indent: 20px;
## }
##
## #fnxcvpbjhy .gt_indent_5 {
## text-indent: 25px;
## }
##
## #fnxcvpbjhy .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #fnxcvpbjhy div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_farmer vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_farmer</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.3</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">75 (40%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">92 (49%)</td>
## <td headers="stat_0" class="gt_row gt_center">188 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">6 (33%)</td>
## <td headers="stat_2" class="gt_row gt_center">0 (0%)</td>
## <td headers="stat_3" class="gt_row gt_center">12 (67%)</td>
## <td headers="stat_0" class="gt_row gt_center">18 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[4]]
## <div id="vhxyqwhqww" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#vhxyqwhqww table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #vhxyqwhqww thead, #vhxyqwhqww tbody, #vhxyqwhqww tfoot, #vhxyqwhqww tr, #vhxyqwhqww td, #vhxyqwhqww th {
## border-style: none;
## }
##
## #vhxyqwhqww p {
## margin: 0;
## padding: 0;
## }
##
## #vhxyqwhqww .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #vhxyqwhqww .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #vhxyqwhqww .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #vhxyqwhqww .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #vhxyqwhqww .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #vhxyqwhqww .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #vhxyqwhqww .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #vhxyqwhqww .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #vhxyqwhqww .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #vhxyqwhqww .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #vhxyqwhqww .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #vhxyqwhqww .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #vhxyqwhqww .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #vhxyqwhqww .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #vhxyqwhqww .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #vhxyqwhqww .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #vhxyqwhqww .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #vhxyqwhqww .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #vhxyqwhqww .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #vhxyqwhqww .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #vhxyqwhqww .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #vhxyqwhqww .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #vhxyqwhqww .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #vhxyqwhqww .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #vhxyqwhqww .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #vhxyqwhqww .gt_left {
## text-align: left;
## }
##
## #vhxyqwhqww .gt_center {
## text-align: center;
## }
##
## #vhxyqwhqww .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #vhxyqwhqww .gt_font_normal {
## font-weight: normal;
## }
##
## #vhxyqwhqww .gt_font_bold {
## font-weight: bold;
## }
##
## #vhxyqwhqww .gt_font_italic {
## font-style: italic;
## }
##
## #vhxyqwhqww .gt_super {
## font-size: 65%;
## }
##
## #vhxyqwhqww .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #vhxyqwhqww .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #vhxyqwhqww .gt_indent_1 {
## text-indent: 5px;
## }
##
## #vhxyqwhqww .gt_indent_2 {
## text-indent: 10px;
## }
##
## #vhxyqwhqww .gt_indent_3 {
## text-indent: 15px;
## }
##
## #vhxyqwhqww .gt_indent_4 {
## text-indent: 20px;
## }
##
## #vhxyqwhqww .gt_indent_5 {
## text-indent: 25px;
## }
##
## #vhxyqwhqww .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #vhxyqwhqww div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_own_idea vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_own_idea</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.5</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">64 (38%)</td>
## <td headers="stat_2" class="gt_row gt_center">19 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">87 (51%)</td>
## <td headers="stat_0" class="gt_row gt_center">170 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">17 (47%)</td>
## <td headers="stat_2" class="gt_row gt_center">2 (5.6%)</td>
## <td headers="stat_3" class="gt_row gt_center">17 (47%)</td>
## <td headers="stat_0" class="gt_row gt_center">36 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[5]]
## <div id="cubwmciqhu" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#cubwmciqhu table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #cubwmciqhu thead, #cubwmciqhu tbody, #cubwmciqhu tfoot, #cubwmciqhu tr, #cubwmciqhu td, #cubwmciqhu th {
## border-style: none;
## }
##
## #cubwmciqhu p {
## margin: 0;
## padding: 0;
## }
##
## #cubwmciqhu .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #cubwmciqhu .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #cubwmciqhu .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #cubwmciqhu .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #cubwmciqhu .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #cubwmciqhu .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #cubwmciqhu .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #cubwmciqhu .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #cubwmciqhu .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #cubwmciqhu .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #cubwmciqhu .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #cubwmciqhu .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #cubwmciqhu .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #cubwmciqhu .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #cubwmciqhu .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #cubwmciqhu .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #cubwmciqhu .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #cubwmciqhu .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #cubwmciqhu .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #cubwmciqhu .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #cubwmciqhu .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #cubwmciqhu .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #cubwmciqhu .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #cubwmciqhu .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #cubwmciqhu .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #cubwmciqhu .gt_left {
## text-align: left;
## }
##
## #cubwmciqhu .gt_center {
## text-align: center;
## }
##
## #cubwmciqhu .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #cubwmciqhu .gt_font_normal {
## font-weight: normal;
## }
##
## #cubwmciqhu .gt_font_bold {
## font-weight: bold;
## }
##
## #cubwmciqhu .gt_font_italic {
## font-style: italic;
## }
##
## #cubwmciqhu .gt_super {
## font-size: 65%;
## }
##
## #cubwmciqhu .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #cubwmciqhu .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #cubwmciqhu .gt_indent_1 {
## text-indent: 5px;
## }
##
## #cubwmciqhu .gt_indent_2 {
## text-indent: 10px;
## }
##
## #cubwmciqhu .gt_indent_3 {
## text-indent: 15px;
## }
##
## #cubwmciqhu .gt_indent_4 {
## text-indent: 20px;
## }
##
## #cubwmciqhu .gt_indent_5 {
## text-indent: 25px;
## }
##
## #cubwmciqhu .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #cubwmciqhu div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>any_control_method vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">any_control_method</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.018</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">12 (71%)</td>
## <td headers="stat_2" class="gt_row gt_center">0 (0%)</td>
## <td headers="stat_3" class="gt_row gt_center">5 (29%)</td>
## <td headers="stat_0" class="gt_row gt_center">17 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">69 (37%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">99 (52%)</td>
## <td headers="stat_0" class="gt_row gt_center">189 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[6]]
## <div id="grrnrhullu" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#grrnrhullu table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #grrnrhullu thead, #grrnrhullu tbody, #grrnrhullu tfoot, #grrnrhullu tr, #grrnrhullu td, #grrnrhullu th {
## border-style: none;
## }
##
## #grrnrhullu p {
## margin: 0;
## padding: 0;
## }
##
## #grrnrhullu .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #grrnrhullu .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #grrnrhullu .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #grrnrhullu .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #grrnrhullu .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #grrnrhullu .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #grrnrhullu .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #grrnrhullu .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #grrnrhullu .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #grrnrhullu .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #grrnrhullu .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #grrnrhullu .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #grrnrhullu .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #grrnrhullu .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #grrnrhullu .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #grrnrhullu .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #grrnrhullu .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #grrnrhullu .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #grrnrhullu .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #grrnrhullu .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #grrnrhullu .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #grrnrhullu .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #grrnrhullu .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #grrnrhullu .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #grrnrhullu .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #grrnrhullu .gt_left {
## text-align: left;
## }
##
## #grrnrhullu .gt_center {
## text-align: center;
## }
##
## #grrnrhullu .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #grrnrhullu .gt_font_normal {
## font-weight: normal;
## }
##
## #grrnrhullu .gt_font_bold {
## font-weight: bold;
## }
##
## #grrnrhullu .gt_font_italic {
## font-style: italic;
## }
##
## #grrnrhullu .gt_super {
## font-size: 65%;
## }
##
## #grrnrhullu .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #grrnrhullu .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #grrnrhullu .gt_indent_1 {
## text-indent: 5px;
## }
##
## #grrnrhullu .gt_indent_2 {
## text-indent: 10px;
## }
##
## #grrnrhullu .gt_indent_3 {
## text-indent: 15px;
## }
##
## #grrnrhullu .gt_indent_4 {
## text-indent: 20px;
## }
##
## #grrnrhullu .gt_indent_5 {
## text-indent: 25px;
## }
##
## #grrnrhullu .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #grrnrhullu div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>ask_vet vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">ask_vet</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.2</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">37 (47%)</td>
## <td headers="stat_2" class="gt_row gt_center">8 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">34 (43%)</td>
## <td headers="stat_0" class="gt_row gt_center">79 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">44 (35%)</td>
## <td headers="stat_2" class="gt_row gt_center">13 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">70 (55%)</td>
## <td headers="stat_0" class="gt_row gt_center">127 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[7]]
## <div id="uaeyqpwhrv" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#uaeyqpwhrv table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #uaeyqpwhrv thead, #uaeyqpwhrv tbody, #uaeyqpwhrv tfoot, #uaeyqpwhrv tr, #uaeyqpwhrv td, #uaeyqpwhrv th {
## border-style: none;
## }
##
## #uaeyqpwhrv p {
## margin: 0;
## padding: 0;
## }
##
## #uaeyqpwhrv .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #uaeyqpwhrv .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #uaeyqpwhrv .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #uaeyqpwhrv .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #uaeyqpwhrv .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #uaeyqpwhrv .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #uaeyqpwhrv .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #uaeyqpwhrv .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #uaeyqpwhrv .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #uaeyqpwhrv .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #uaeyqpwhrv .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #uaeyqpwhrv .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #uaeyqpwhrv .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #uaeyqpwhrv .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #uaeyqpwhrv .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uaeyqpwhrv .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #uaeyqpwhrv .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #uaeyqpwhrv .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #uaeyqpwhrv .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uaeyqpwhrv .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #uaeyqpwhrv .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uaeyqpwhrv .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #uaeyqpwhrv .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uaeyqpwhrv .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #uaeyqpwhrv .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uaeyqpwhrv .gt_left {
## text-align: left;
## }
##
## #uaeyqpwhrv .gt_center {
## text-align: center;
## }
##
## #uaeyqpwhrv .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #uaeyqpwhrv .gt_font_normal {
## font-weight: normal;
## }
##
## #uaeyqpwhrv .gt_font_bold {
## font-weight: bold;
## }
##
## #uaeyqpwhrv .gt_font_italic {
## font-style: italic;
## }
##
## #uaeyqpwhrv .gt_super {
## font-size: 65%;
## }
##
## #uaeyqpwhrv .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #uaeyqpwhrv .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #uaeyqpwhrv .gt_indent_1 {
## text-indent: 5px;
## }
##
## #uaeyqpwhrv .gt_indent_2 {
## text-indent: 10px;
## }
##
## #uaeyqpwhrv .gt_indent_3 {
## text-indent: 15px;
## }
##
## #uaeyqpwhrv .gt_indent_4 {
## text-indent: 20px;
## }
##
## #uaeyqpwhrv .gt_indent_5 {
## text-indent: 25px;
## }
##
## #uaeyqpwhrv .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #uaeyqpwhrv div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>control_vector vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">control_vector</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.8</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">62 (38%)</td>
## <td headers="stat_2" class="gt_row gt_center">16 (9.9%)</td>
## <td headers="stat_3" class="gt_row gt_center">84 (52%)</td>
## <td headers="stat_0" class="gt_row gt_center">162 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">19 (43%)</td>
## <td headers="stat_2" class="gt_row gt_center">5 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">20 (45%)</td>
## <td headers="stat_0" class="gt_row gt_center">44 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[8]]
## <div id="jzixztvkoe" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#jzixztvkoe table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #jzixztvkoe thead, #jzixztvkoe tbody, #jzixztvkoe tfoot, #jzixztvkoe tr, #jzixztvkoe td, #jzixztvkoe th {
## border-style: none;
## }
##
## #jzixztvkoe p {
## margin: 0;
## padding: 0;
## }
##
## #jzixztvkoe .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #jzixztvkoe .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #jzixztvkoe .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #jzixztvkoe .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #jzixztvkoe .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #jzixztvkoe .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #jzixztvkoe .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #jzixztvkoe .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #jzixztvkoe .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #jzixztvkoe .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #jzixztvkoe .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #jzixztvkoe .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #jzixztvkoe .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #jzixztvkoe .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #jzixztvkoe .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #jzixztvkoe .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #jzixztvkoe .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #jzixztvkoe .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #jzixztvkoe .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #jzixztvkoe .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #jzixztvkoe .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #jzixztvkoe .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #jzixztvkoe .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #jzixztvkoe .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #jzixztvkoe .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #jzixztvkoe .gt_left {
## text-align: left;
## }
##
## #jzixztvkoe .gt_center {
## text-align: center;
## }
##
## #jzixztvkoe .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #jzixztvkoe .gt_font_normal {
## font-weight: normal;
## }
##
## #jzixztvkoe .gt_font_bold {
## font-weight: bold;
## }
##
## #jzixztvkoe .gt_font_italic {
## font-style: italic;
## }
##
## #jzixztvkoe .gt_super {
## font-size: 65%;
## }
##
## #jzixztvkoe .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #jzixztvkoe .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #jzixztvkoe .gt_indent_1 {
## text-indent: 5px;
## }
##
## #jzixztvkoe .gt_indent_2 {
## text-indent: 10px;
## }
##
## #jzixztvkoe .gt_indent_3 {
## text-indent: 15px;
## }
##
## #jzixztvkoe .gt_indent_4 {
## text-indent: 20px;
## }
##
## #jzixztvkoe .gt_indent_5 {
## text-indent: 25px;
## }
##
## #jzixztvkoe .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #jzixztvkoe div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>deworming vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">deworming</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.6</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">48 (41%)</td>
## <td headers="stat_2" class="gt_row gt_center">10 (8.5%)</td>
## <td headers="stat_3" class="gt_row gt_center">60 (51%)</td>
## <td headers="stat_0" class="gt_row gt_center">118 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">33 (38%)</td>
## <td headers="stat_2" class="gt_row gt_center">11 (13%)</td>
## <td headers="stat_3" class="gt_row gt_center">44 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">88 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[9]]
## <div id="azdyzboain" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#azdyzboain table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #azdyzboain thead, #azdyzboain tbody, #azdyzboain tfoot, #azdyzboain tr, #azdyzboain td, #azdyzboain th {
## border-style: none;
## }
##
## #azdyzboain p {
## margin: 0;
## padding: 0;
## }
##
## #azdyzboain .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #azdyzboain .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #azdyzboain .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #azdyzboain .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #azdyzboain .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #azdyzboain .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #azdyzboain .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #azdyzboain .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #azdyzboain .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #azdyzboain .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #azdyzboain .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #azdyzboain .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #azdyzboain .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #azdyzboain .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #azdyzboain .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #azdyzboain .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #azdyzboain .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #azdyzboain .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #azdyzboain .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #azdyzboain .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #azdyzboain .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #azdyzboain .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #azdyzboain .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #azdyzboain .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #azdyzboain .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #azdyzboain .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #azdyzboain .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #azdyzboain .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #azdyzboain .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #azdyzboain .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #azdyzboain .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #azdyzboain .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #azdyzboain .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #azdyzboain .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #azdyzboain .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #azdyzboain .gt_left {
## text-align: left;
## }
##
## #azdyzboain .gt_center {
## text-align: center;
## }
##
## #azdyzboain .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #azdyzboain .gt_font_normal {
## font-weight: normal;
## }
##
## #azdyzboain .gt_font_bold {
## font-weight: bold;
## }
##
## #azdyzboain .gt_font_italic {
## font-style: italic;
## }
##
## #azdyzboain .gt_super {
## font-size: 65%;
## }
##
## #azdyzboain .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #azdyzboain .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #azdyzboain .gt_indent_1 {
## text-indent: 5px;
## }
##
## #azdyzboain .gt_indent_2 {
## text-indent: 10px;
## }
##
## #azdyzboain .gt_indent_3 {
## text-indent: 15px;
## }
##
## #azdyzboain .gt_indent_4 {
## text-indent: 20px;
## }
##
## #azdyzboain .gt_indent_5 {
## text-indent: 25px;
## }
##
## #azdyzboain .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #azdyzboain div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>any_personal_protection vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">any_personal_protection</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.002</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">17 (74%)</td>
## <td headers="stat_2" class="gt_row gt_center">0 (0%)</td>
## <td headers="stat_3" class="gt_row gt_center">6 (26%)</td>
## <td headers="stat_0" class="gt_row gt_center">23 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">64 (35%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">98 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">183 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[10]]
## <div id="wzbylbahbu" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#wzbylbahbu table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #wzbylbahbu thead, #wzbylbahbu tbody, #wzbylbahbu tfoot, #wzbylbahbu tr, #wzbylbahbu td, #wzbylbahbu th {
## border-style: none;
## }
##
## #wzbylbahbu p {
## margin: 0;
## padding: 0;
## }
##
## #wzbylbahbu .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #wzbylbahbu .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #wzbylbahbu .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #wzbylbahbu .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #wzbylbahbu .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #wzbylbahbu .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #wzbylbahbu .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #wzbylbahbu .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #wzbylbahbu .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #wzbylbahbu .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #wzbylbahbu .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #wzbylbahbu .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #wzbylbahbu .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #wzbylbahbu .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #wzbylbahbu .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #wzbylbahbu .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #wzbylbahbu .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #wzbylbahbu .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #wzbylbahbu .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #wzbylbahbu .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #wzbylbahbu .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #wzbylbahbu .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #wzbylbahbu .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #wzbylbahbu .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #wzbylbahbu .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #wzbylbahbu .gt_left {
## text-align: left;
## }
##
## #wzbylbahbu .gt_center {
## text-align: center;
## }
##
## #wzbylbahbu .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #wzbylbahbu .gt_font_normal {
## font-weight: normal;
## }
##
## #wzbylbahbu .gt_font_bold {
## font-weight: bold;
## }
##
## #wzbylbahbu .gt_font_italic {
## font-style: italic;
## }
##
## #wzbylbahbu .gt_super {
## font-size: 65%;
## }
##
## #wzbylbahbu .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #wzbylbahbu .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #wzbylbahbu .gt_indent_1 {
## text-indent: 5px;
## }
##
## #wzbylbahbu .gt_indent_2 {
## text-indent: 10px;
## }
##
## #wzbylbahbu .gt_indent_3 {
## text-indent: 15px;
## }
##
## #wzbylbahbu .gt_indent_4 {
## text-indent: 20px;
## }
##
## #wzbylbahbu .gt_indent_5 {
## text-indent: 25px;
## }
##
## #wzbylbahbu .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #wzbylbahbu div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>gloves vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">gloves</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.9</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">78 (40%)</td>
## <td headers="stat_2" class="gt_row gt_center">20 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">98 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">196 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">3 (30%)</td>
## <td headers="stat_2" class="gt_row gt_center">1 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">6 (60%)</td>
## <td headers="stat_0" class="gt_row gt_center">10 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[11]]
## <div id="kyihtqdawi" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#kyihtqdawi table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #kyihtqdawi thead, #kyihtqdawi tbody, #kyihtqdawi tfoot, #kyihtqdawi tr, #kyihtqdawi td, #kyihtqdawi th {
## border-style: none;
## }
##
## #kyihtqdawi p {
## margin: 0;
## padding: 0;
## }
##
## #kyihtqdawi .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #kyihtqdawi .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #kyihtqdawi .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #kyihtqdawi .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #kyihtqdawi .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #kyihtqdawi .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #kyihtqdawi .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #kyihtqdawi .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #kyihtqdawi .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #kyihtqdawi .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #kyihtqdawi .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #kyihtqdawi .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #kyihtqdawi .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #kyihtqdawi .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #kyihtqdawi .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #kyihtqdawi .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #kyihtqdawi .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #kyihtqdawi .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #kyihtqdawi .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #kyihtqdawi .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #kyihtqdawi .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #kyihtqdawi .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #kyihtqdawi .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #kyihtqdawi .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #kyihtqdawi .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #kyihtqdawi .gt_left {
## text-align: left;
## }
##
## #kyihtqdawi .gt_center {
## text-align: center;
## }
##
## #kyihtqdawi .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #kyihtqdawi .gt_font_normal {
## font-weight: normal;
## }
##
## #kyihtqdawi .gt_font_bold {
## font-weight: bold;
## }
##
## #kyihtqdawi .gt_font_italic {
## font-style: italic;
## }
##
## #kyihtqdawi .gt_super {
## font-size: 65%;
## }
##
## #kyihtqdawi .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #kyihtqdawi .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #kyihtqdawi .gt_indent_1 {
## text-indent: 5px;
## }
##
## #kyihtqdawi .gt_indent_2 {
## text-indent: 10px;
## }
##
## #kyihtqdawi .gt_indent_3 {
## text-indent: 15px;
## }
##
## #kyihtqdawi .gt_indent_4 {
## text-indent: 20px;
## }
##
## #kyihtqdawi .gt_indent_5 {
## text-indent: 25px;
## }
##
## #kyihtqdawi .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #kyihtqdawi div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>regular vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">regular</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.5</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">73 (41%)</td>
## <td headers="stat_2" class="gt_row gt_center">18 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">88 (49%)</td>
## <td headers="stat_0" class="gt_row gt_center">179 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">8 (30%)</td>
## <td headers="stat_2" class="gt_row gt_center">3 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">16 (59%)</td>
## <td headers="stat_0" class="gt_row gt_center">27 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[12]]
## <div id="qvpnxomrrp" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#qvpnxomrrp table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #qvpnxomrrp thead, #qvpnxomrrp tbody, #qvpnxomrrp tfoot, #qvpnxomrrp tr, #qvpnxomrrp td, #qvpnxomrrp th {
## border-style: none;
## }
##
## #qvpnxomrrp p {
## margin: 0;
## padding: 0;
## }
##
## #qvpnxomrrp .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #qvpnxomrrp .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #qvpnxomrrp .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #qvpnxomrrp .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #qvpnxomrrp .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #qvpnxomrrp .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #qvpnxomrrp .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #qvpnxomrrp .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #qvpnxomrrp .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #qvpnxomrrp .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #qvpnxomrrp .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #qvpnxomrrp .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #qvpnxomrrp .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #qvpnxomrrp .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #qvpnxomrrp .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvpnxomrrp .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #qvpnxomrrp .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #qvpnxomrrp .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #qvpnxomrrp .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvpnxomrrp .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #qvpnxomrrp .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvpnxomrrp .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #qvpnxomrrp .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvpnxomrrp .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #qvpnxomrrp .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvpnxomrrp .gt_left {
## text-align: left;
## }
##
## #qvpnxomrrp .gt_center {
## text-align: center;
## }
##
## #qvpnxomrrp .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #qvpnxomrrp .gt_font_normal {
## font-weight: normal;
## }
##
## #qvpnxomrrp .gt_font_bold {
## font-weight: bold;
## }
##
## #qvpnxomrrp .gt_font_italic {
## font-style: italic;
## }
##
## #qvpnxomrrp .gt_super {
## font-size: 65%;
## }
##
## #qvpnxomrrp .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #qvpnxomrrp .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #qvpnxomrrp .gt_indent_1 {
## text-indent: 5px;
## }
##
## #qvpnxomrrp .gt_indent_2 {
## text-indent: 10px;
## }
##
## #qvpnxomrrp .gt_indent_3 {
## text-indent: 15px;
## }
##
## #qvpnxomrrp .gt_indent_4 {
## text-indent: 20px;
## }
##
## #qvpnxomrrp .gt_indent_5 {
## text-indent: 25px;
## }
##
## #qvpnxomrrp .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #qvpnxomrrp div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>clean_shed vs. para_zoonotic_knowledge</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="3" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>para_zoonotic_knowledge</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>dont know</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_3"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">clean_shed</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_3" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.13</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">21 (54%)</td>
## <td headers="stat_2" class="gt_row gt_center">3 (7.7%)</td>
## <td headers="stat_3" class="gt_row gt_center">15 (38%)</td>
## <td headers="stat_0" class="gt_row gt_center">39 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">60 (36%)</td>
## <td headers="stat_2" class="gt_row gt_center">18 (11%)</td>
## <td headers="stat_3" class="gt_row gt_center">89 (53%)</td>
## <td headers="stat_0" class="gt_row gt_center">167 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">81 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">21 (10%)</td>
## <td headers="stat_3" class="gt_row gt_center">104 (50%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="6"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[13]]
## <div id="quetajbyix" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#quetajbyix table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #quetajbyix thead, #quetajbyix tbody, #quetajbyix tfoot, #quetajbyix tr, #quetajbyix td, #quetajbyix th {
## border-style: none;
## }
##
## #quetajbyix p {
## margin: 0;
## padding: 0;
## }
##
## #quetajbyix .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #quetajbyix .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #quetajbyix .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #quetajbyix .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #quetajbyix .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #quetajbyix .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #quetajbyix .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #quetajbyix .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #quetajbyix .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #quetajbyix .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #quetajbyix .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #quetajbyix .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #quetajbyix .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #quetajbyix .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #quetajbyix .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #quetajbyix .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #quetajbyix .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #quetajbyix .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #quetajbyix .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #quetajbyix .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #quetajbyix .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #quetajbyix .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #quetajbyix .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #quetajbyix .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #quetajbyix .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #quetajbyix .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #quetajbyix .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #quetajbyix .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #quetajbyix .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #quetajbyix .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #quetajbyix .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #quetajbyix .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #quetajbyix .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #quetajbyix .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #quetajbyix .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #quetajbyix .gt_left {
## text-align: left;
## }
##
## #quetajbyix .gt_center {
## text-align: center;
## }
##
## #quetajbyix .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #quetajbyix .gt_font_normal {
## font-weight: normal;
## }
##
## #quetajbyix .gt_font_bold {
## font-weight: bold;
## }
##
## #quetajbyix .gt_font_italic {
## font-style: italic;
## }
##
## #quetajbyix .gt_super {
## font-size: 65%;
## }
##
## #quetajbyix .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #quetajbyix .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #quetajbyix .gt_indent_1 {
## text-indent: 5px;
## }
##
## #quetajbyix .gt_indent_2 {
## text-indent: 10px;
## }
##
## #quetajbyix .gt_indent_3 {
## text-indent: 15px;
## }
##
## #quetajbyix .gt_indent_4 {
## text-indent: 20px;
## }
##
## #quetajbyix .gt_indent_5 {
## text-indent: 25px;
## }
##
## #quetajbyix .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #quetajbyix div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_vet vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_vet</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.11</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">35 (54%)</td>
## <td headers="stat_2" class="gt_row gt_center">30 (46%)</td>
## <td headers="stat_0" class="gt_row gt_center">65 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">59 (42%)</td>
## <td headers="stat_2" class="gt_row gt_center">82 (58%)</td>
## <td headers="stat_0" class="gt_row gt_center">141 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[14]]
## <div id="meurpqkitn" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#meurpqkitn table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #meurpqkitn thead, #meurpqkitn tbody, #meurpqkitn tfoot, #meurpqkitn tr, #meurpqkitn td, #meurpqkitn th {
## border-style: none;
## }
##
## #meurpqkitn p {
## margin: 0;
## padding: 0;
## }
##
## #meurpqkitn .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #meurpqkitn .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #meurpqkitn .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #meurpqkitn .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #meurpqkitn .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #meurpqkitn .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #meurpqkitn .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #meurpqkitn .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #meurpqkitn .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #meurpqkitn .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #meurpqkitn .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #meurpqkitn .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #meurpqkitn .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #meurpqkitn .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #meurpqkitn .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #meurpqkitn .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #meurpqkitn .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #meurpqkitn .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #meurpqkitn .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #meurpqkitn .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #meurpqkitn .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #meurpqkitn .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #meurpqkitn .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #meurpqkitn .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #meurpqkitn .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #meurpqkitn .gt_left {
## text-align: left;
## }
##
## #meurpqkitn .gt_center {
## text-align: center;
## }
##
## #meurpqkitn .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #meurpqkitn .gt_font_normal {
## font-weight: normal;
## }
##
## #meurpqkitn .gt_font_bold {
## font-weight: bold;
## }
##
## #meurpqkitn .gt_font_italic {
## font-style: italic;
## }
##
## #meurpqkitn .gt_super {
## font-size: 65%;
## }
##
## #meurpqkitn .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #meurpqkitn .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #meurpqkitn .gt_indent_1 {
## text-indent: 5px;
## }
##
## #meurpqkitn .gt_indent_2 {
## text-indent: 10px;
## }
##
## #meurpqkitn .gt_indent_3 {
## text-indent: 15px;
## }
##
## #meurpqkitn .gt_indent_4 {
## text-indent: 20px;
## }
##
## #meurpqkitn .gt_indent_5 {
## text-indent: 25px;
## }
##
## #meurpqkitn .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #meurpqkitn div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_medicine_seller vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_medicine_seller</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.063</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">64 (42%)</td>
## <td headers="stat_2" class="gt_row gt_center">89 (58%)</td>
## <td headers="stat_0" class="gt_row gt_center">153 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">30 (57%)</td>
## <td headers="stat_2" class="gt_row gt_center">23 (43%)</td>
## <td headers="stat_0" class="gt_row gt_center">53 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[15]]
## <div id="iqlgmqldmt" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#iqlgmqldmt table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #iqlgmqldmt thead, #iqlgmqldmt tbody, #iqlgmqldmt tfoot, #iqlgmqldmt tr, #iqlgmqldmt td, #iqlgmqldmt th {
## border-style: none;
## }
##
## #iqlgmqldmt p {
## margin: 0;
## padding: 0;
## }
##
## #iqlgmqldmt .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #iqlgmqldmt .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #iqlgmqldmt .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #iqlgmqldmt .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #iqlgmqldmt .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #iqlgmqldmt .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #iqlgmqldmt .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #iqlgmqldmt .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #iqlgmqldmt .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #iqlgmqldmt .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #iqlgmqldmt .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #iqlgmqldmt .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #iqlgmqldmt .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #iqlgmqldmt .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #iqlgmqldmt .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #iqlgmqldmt .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #iqlgmqldmt .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #iqlgmqldmt .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #iqlgmqldmt .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #iqlgmqldmt .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #iqlgmqldmt .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #iqlgmqldmt .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #iqlgmqldmt .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #iqlgmqldmt .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #iqlgmqldmt .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #iqlgmqldmt .gt_left {
## text-align: left;
## }
##
## #iqlgmqldmt .gt_center {
## text-align: center;
## }
##
## #iqlgmqldmt .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #iqlgmqldmt .gt_font_normal {
## font-weight: normal;
## }
##
## #iqlgmqldmt .gt_font_bold {
## font-weight: bold;
## }
##
## #iqlgmqldmt .gt_font_italic {
## font-style: italic;
## }
##
## #iqlgmqldmt .gt_super {
## font-size: 65%;
## }
##
## #iqlgmqldmt .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #iqlgmqldmt .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #iqlgmqldmt .gt_indent_1 {
## text-indent: 5px;
## }
##
## #iqlgmqldmt .gt_indent_2 {
## text-indent: 10px;
## }
##
## #iqlgmqldmt .gt_indent_3 {
## text-indent: 15px;
## }
##
## #iqlgmqldmt .gt_indent_4 {
## text-indent: 20px;
## }
##
## #iqlgmqldmt .gt_indent_5 {
## text-indent: 25px;
## }
##
## #iqlgmqldmt .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #iqlgmqldmt div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_farmer vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_farmer</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.5</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">87 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">101 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">188 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">7 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">11 (61%)</td>
## <td headers="stat_0" class="gt_row gt_center">18 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[16]]
## <div id="tnoznmsjip" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#tnoznmsjip table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #tnoznmsjip thead, #tnoznmsjip tbody, #tnoznmsjip tfoot, #tnoznmsjip tr, #tnoznmsjip td, #tnoznmsjip th {
## border-style: none;
## }
##
## #tnoznmsjip p {
## margin: 0;
## padding: 0;
## }
##
## #tnoznmsjip .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #tnoznmsjip .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #tnoznmsjip .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #tnoznmsjip .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #tnoznmsjip .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #tnoznmsjip .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #tnoznmsjip .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #tnoznmsjip .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #tnoznmsjip .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #tnoznmsjip .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #tnoznmsjip .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #tnoznmsjip .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #tnoznmsjip .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #tnoznmsjip .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #tnoznmsjip .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #tnoznmsjip .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #tnoznmsjip .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #tnoznmsjip .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #tnoznmsjip .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #tnoznmsjip .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #tnoznmsjip .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #tnoznmsjip .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #tnoznmsjip .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #tnoznmsjip .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #tnoznmsjip .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #tnoznmsjip .gt_left {
## text-align: left;
## }
##
## #tnoznmsjip .gt_center {
## text-align: center;
## }
##
## #tnoznmsjip .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #tnoznmsjip .gt_font_normal {
## font-weight: normal;
## }
##
## #tnoznmsjip .gt_font_bold {
## font-weight: bold;
## }
##
## #tnoznmsjip .gt_font_italic {
## font-style: italic;
## }
##
## #tnoznmsjip .gt_super {
## font-size: 65%;
## }
##
## #tnoznmsjip .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #tnoznmsjip .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #tnoznmsjip .gt_indent_1 {
## text-indent: 5px;
## }
##
## #tnoznmsjip .gt_indent_2 {
## text-indent: 10px;
## }
##
## #tnoznmsjip .gt_indent_3 {
## text-indent: 15px;
## }
##
## #tnoznmsjip .gt_indent_4 {
## text-indent: 20px;
## }
##
## #tnoznmsjip .gt_indent_5 {
## text-indent: 25px;
## }
##
## #tnoznmsjip .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #tnoznmsjip div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>uses_own_idea vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">uses_own_idea</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.4</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">80 (47%)</td>
## <td headers="stat_2" class="gt_row gt_center">90 (53%)</td>
## <td headers="stat_0" class="gt_row gt_center">170 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">14 (39%)</td>
## <td headers="stat_2" class="gt_row gt_center">22 (61%)</td>
## <td headers="stat_0" class="gt_row gt_center">36 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[17]]
## <div id="qvffwlyokf" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#qvffwlyokf table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #qvffwlyokf thead, #qvffwlyokf tbody, #qvffwlyokf tfoot, #qvffwlyokf tr, #qvffwlyokf td, #qvffwlyokf th {
## border-style: none;
## }
##
## #qvffwlyokf p {
## margin: 0;
## padding: 0;
## }
##
## #qvffwlyokf .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #qvffwlyokf .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #qvffwlyokf .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #qvffwlyokf .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #qvffwlyokf .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #qvffwlyokf .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #qvffwlyokf .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #qvffwlyokf .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #qvffwlyokf .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #qvffwlyokf .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #qvffwlyokf .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #qvffwlyokf .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #qvffwlyokf .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #qvffwlyokf .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #qvffwlyokf .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvffwlyokf .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #qvffwlyokf .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #qvffwlyokf .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #qvffwlyokf .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvffwlyokf .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #qvffwlyokf .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvffwlyokf .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #qvffwlyokf .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvffwlyokf .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #qvffwlyokf .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #qvffwlyokf .gt_left {
## text-align: left;
## }
##
## #qvffwlyokf .gt_center {
## text-align: center;
## }
##
## #qvffwlyokf .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #qvffwlyokf .gt_font_normal {
## font-weight: normal;
## }
##
## #qvffwlyokf .gt_font_bold {
## font-weight: bold;
## }
##
## #qvffwlyokf .gt_font_italic {
## font-style: italic;
## }
##
## #qvffwlyokf .gt_super {
## font-size: 65%;
## }
##
## #qvffwlyokf .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #qvffwlyokf .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #qvffwlyokf .gt_indent_1 {
## text-indent: 5px;
## }
##
## #qvffwlyokf .gt_indent_2 {
## text-indent: 10px;
## }
##
## #qvffwlyokf .gt_indent_3 {
## text-indent: 15px;
## }
##
## #qvffwlyokf .gt_indent_4 {
## text-indent: 20px;
## }
##
## #qvffwlyokf .gt_indent_5 {
## text-indent: 25px;
## }
##
## #qvffwlyokf .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #qvffwlyokf div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>any_control_method vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">any_control_method</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.008</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">13 (76%)</td>
## <td headers="stat_2" class="gt_row gt_center">4 (24%)</td>
## <td headers="stat_0" class="gt_row gt_center">17 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">81 (43%)</td>
## <td headers="stat_2" class="gt_row gt_center">108 (57%)</td>
## <td headers="stat_0" class="gt_row gt_center">189 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[18]]
## <div id="stskotrvci" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#stskotrvci table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #stskotrvci thead, #stskotrvci tbody, #stskotrvci tfoot, #stskotrvci tr, #stskotrvci td, #stskotrvci th {
## border-style: none;
## }
##
## #stskotrvci p {
## margin: 0;
## padding: 0;
## }
##
## #stskotrvci .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #stskotrvci .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #stskotrvci .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #stskotrvci .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #stskotrvci .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #stskotrvci .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #stskotrvci .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #stskotrvci .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #stskotrvci .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #stskotrvci .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #stskotrvci .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #stskotrvci .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #stskotrvci .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #stskotrvci .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #stskotrvci .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #stskotrvci .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #stskotrvci .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #stskotrvci .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #stskotrvci .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #stskotrvci .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #stskotrvci .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #stskotrvci .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #stskotrvci .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #stskotrvci .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #stskotrvci .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #stskotrvci .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #stskotrvci .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #stskotrvci .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #stskotrvci .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #stskotrvci .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #stskotrvci .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #stskotrvci .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #stskotrvci .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #stskotrvci .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #stskotrvci .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #stskotrvci .gt_left {
## text-align: left;
## }
##
## #stskotrvci .gt_center {
## text-align: center;
## }
##
## #stskotrvci .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #stskotrvci .gt_font_normal {
## font-weight: normal;
## }
##
## #stskotrvci .gt_font_bold {
## font-weight: bold;
## }
##
## #stskotrvci .gt_font_italic {
## font-style: italic;
## }
##
## #stskotrvci .gt_super {
## font-size: 65%;
## }
##
## #stskotrvci .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #stskotrvci .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #stskotrvci .gt_indent_1 {
## text-indent: 5px;
## }
##
## #stskotrvci .gt_indent_2 {
## text-indent: 10px;
## }
##
## #stskotrvci .gt_indent_3 {
## text-indent: 15px;
## }
##
## #stskotrvci .gt_indent_4 {
## text-indent: 20px;
## }
##
## #stskotrvci .gt_indent_5 {
## text-indent: 25px;
## }
##
## #stskotrvci .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #stskotrvci div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>ask_vet vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">ask_vet</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.046</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">43 (54%)</td>
## <td headers="stat_2" class="gt_row gt_center">36 (46%)</td>
## <td headers="stat_0" class="gt_row gt_center">79 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">51 (40%)</td>
## <td headers="stat_2" class="gt_row gt_center">76 (60%)</td>
## <td headers="stat_0" class="gt_row gt_center">127 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[19]]
## <div id="snleglebhx" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#snleglebhx table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #snleglebhx thead, #snleglebhx tbody, #snleglebhx tfoot, #snleglebhx tr, #snleglebhx td, #snleglebhx th {
## border-style: none;
## }
##
## #snleglebhx p {
## margin: 0;
## padding: 0;
## }
##
## #snleglebhx .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #snleglebhx .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #snleglebhx .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #snleglebhx .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #snleglebhx .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #snleglebhx .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #snleglebhx .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #snleglebhx .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #snleglebhx .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #snleglebhx .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #snleglebhx .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #snleglebhx .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #snleglebhx .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #snleglebhx .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #snleglebhx .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #snleglebhx .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #snleglebhx .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #snleglebhx .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #snleglebhx .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #snleglebhx .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #snleglebhx .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #snleglebhx .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #snleglebhx .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #snleglebhx .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #snleglebhx .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #snleglebhx .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #snleglebhx .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #snleglebhx .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #snleglebhx .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #snleglebhx .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #snleglebhx .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #snleglebhx .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #snleglebhx .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #snleglebhx .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #snleglebhx .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #snleglebhx .gt_left {
## text-align: left;
## }
##
## #snleglebhx .gt_center {
## text-align: center;
## }
##
## #snleglebhx .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #snleglebhx .gt_font_normal {
## font-weight: normal;
## }
##
## #snleglebhx .gt_font_bold {
## font-weight: bold;
## }
##
## #snleglebhx .gt_font_italic {
## font-style: italic;
## }
##
## #snleglebhx .gt_super {
## font-size: 65%;
## }
##
## #snleglebhx .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #snleglebhx .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #snleglebhx .gt_indent_1 {
## text-indent: 5px;
## }
##
## #snleglebhx .gt_indent_2 {
## text-indent: 10px;
## }
##
## #snleglebhx .gt_indent_3 {
## text-indent: 15px;
## }
##
## #snleglebhx .gt_indent_4 {
## text-indent: 20px;
## }
##
## #snleglebhx .gt_indent_5 {
## text-indent: 25px;
## }
##
## #snleglebhx .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #snleglebhx div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>control_vector vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">control_vector</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">>0.9</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">74 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">88 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">162 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">20 (45%)</td>
## <td headers="stat_2" class="gt_row gt_center">24 (55%)</td>
## <td headers="stat_0" class="gt_row gt_center">44 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[20]]
## <div id="uggxmpebda" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#uggxmpebda table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #uggxmpebda thead, #uggxmpebda tbody, #uggxmpebda tfoot, #uggxmpebda tr, #uggxmpebda td, #uggxmpebda th {
## border-style: none;
## }
##
## #uggxmpebda p {
## margin: 0;
## padding: 0;
## }
##
## #uggxmpebda .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #uggxmpebda .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #uggxmpebda .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #uggxmpebda .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #uggxmpebda .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #uggxmpebda .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #uggxmpebda .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #uggxmpebda .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #uggxmpebda .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #uggxmpebda .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #uggxmpebda .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #uggxmpebda .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #uggxmpebda .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #uggxmpebda .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #uggxmpebda .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uggxmpebda .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #uggxmpebda .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #uggxmpebda .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #uggxmpebda .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uggxmpebda .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #uggxmpebda .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uggxmpebda .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #uggxmpebda .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uggxmpebda .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #uggxmpebda .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #uggxmpebda .gt_left {
## text-align: left;
## }
##
## #uggxmpebda .gt_center {
## text-align: center;
## }
##
## #uggxmpebda .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #uggxmpebda .gt_font_normal {
## font-weight: normal;
## }
##
## #uggxmpebda .gt_font_bold {
## font-weight: bold;
## }
##
## #uggxmpebda .gt_font_italic {
## font-style: italic;
## }
##
## #uggxmpebda .gt_super {
## font-size: 65%;
## }
##
## #uggxmpebda .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #uggxmpebda .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #uggxmpebda .gt_indent_1 {
## text-indent: 5px;
## }
##
## #uggxmpebda .gt_indent_2 {
## text-indent: 10px;
## }
##
## #uggxmpebda .gt_indent_3 {
## text-indent: 15px;
## }
##
## #uggxmpebda .gt_indent_4 {
## text-indent: 20px;
## }
##
## #uggxmpebda .gt_indent_5 {
## text-indent: 25px;
## }
##
## #uggxmpebda .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #uggxmpebda div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>deworming vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">deworming</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.7</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">55 (47%)</td>
## <td headers="stat_2" class="gt_row gt_center">63 (53%)</td>
## <td headers="stat_0" class="gt_row gt_center">118 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">39 (44%)</td>
## <td headers="stat_2" class="gt_row gt_center">49 (56%)</td>
## <td headers="stat_0" class="gt_row gt_center">88 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[21]]
## <div id="sxszbfabps" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#sxszbfabps table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #sxszbfabps thead, #sxszbfabps tbody, #sxszbfabps tfoot, #sxszbfabps tr, #sxszbfabps td, #sxszbfabps th {
## border-style: none;
## }
##
## #sxszbfabps p {
## margin: 0;
## padding: 0;
## }
##
## #sxszbfabps .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #sxszbfabps .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #sxszbfabps .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #sxszbfabps .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #sxszbfabps .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #sxszbfabps .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #sxszbfabps .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #sxszbfabps .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #sxszbfabps .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #sxszbfabps .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #sxszbfabps .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #sxszbfabps .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #sxszbfabps .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #sxszbfabps .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #sxszbfabps .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #sxszbfabps .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #sxszbfabps .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #sxszbfabps .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #sxszbfabps .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #sxszbfabps .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #sxszbfabps .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #sxszbfabps .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #sxszbfabps .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #sxszbfabps .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #sxszbfabps .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #sxszbfabps .gt_left {
## text-align: left;
## }
##
## #sxszbfabps .gt_center {
## text-align: center;
## }
##
## #sxszbfabps .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #sxszbfabps .gt_font_normal {
## font-weight: normal;
## }
##
## #sxszbfabps .gt_font_bold {
## font-weight: bold;
## }
##
## #sxszbfabps .gt_font_italic {
## font-style: italic;
## }
##
## #sxszbfabps .gt_super {
## font-size: 65%;
## }
##
## #sxszbfabps .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #sxszbfabps .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #sxszbfabps .gt_indent_1 {
## text-indent: 5px;
## }
##
## #sxszbfabps .gt_indent_2 {
## text-indent: 10px;
## }
##
## #sxszbfabps .gt_indent_3 {
## text-indent: 15px;
## }
##
## #sxszbfabps .gt_indent_4 {
## text-indent: 20px;
## }
##
## #sxszbfabps .gt_indent_5 {
## text-indent: 25px;
## }
##
## #sxszbfabps .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #sxszbfabps div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>any_personal_protection vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">any_personal_protection</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.014</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">16 (70%)</td>
## <td headers="stat_2" class="gt_row gt_center">7 (30%)</td>
## <td headers="stat_0" class="gt_row gt_center">23 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">78 (43%)</td>
## <td headers="stat_2" class="gt_row gt_center">105 (57%)</td>
## <td headers="stat_0" class="gt_row gt_center">183 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[22]]
## <div id="ekbuzvlltm" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#ekbuzvlltm table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #ekbuzvlltm thead, #ekbuzvlltm tbody, #ekbuzvlltm tfoot, #ekbuzvlltm tr, #ekbuzvlltm td, #ekbuzvlltm th {
## border-style: none;
## }
##
## #ekbuzvlltm p {
## margin: 0;
## padding: 0;
## }
##
## #ekbuzvlltm .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #ekbuzvlltm .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #ekbuzvlltm .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #ekbuzvlltm .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #ekbuzvlltm .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #ekbuzvlltm .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #ekbuzvlltm .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #ekbuzvlltm .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #ekbuzvlltm .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #ekbuzvlltm .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #ekbuzvlltm .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #ekbuzvlltm .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #ekbuzvlltm .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #ekbuzvlltm .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #ekbuzvlltm .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #ekbuzvlltm .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #ekbuzvlltm .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #ekbuzvlltm .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #ekbuzvlltm .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #ekbuzvlltm .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #ekbuzvlltm .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #ekbuzvlltm .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #ekbuzvlltm .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #ekbuzvlltm .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #ekbuzvlltm .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #ekbuzvlltm .gt_left {
## text-align: left;
## }
##
## #ekbuzvlltm .gt_center {
## text-align: center;
## }
##
## #ekbuzvlltm .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #ekbuzvlltm .gt_font_normal {
## font-weight: normal;
## }
##
## #ekbuzvlltm .gt_font_bold {
## font-weight: bold;
## }
##
## #ekbuzvlltm .gt_font_italic {
## font-style: italic;
## }
##
## #ekbuzvlltm .gt_super {
## font-size: 65%;
## }
##
## #ekbuzvlltm .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #ekbuzvlltm .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #ekbuzvlltm .gt_indent_1 {
## text-indent: 5px;
## }
##
## #ekbuzvlltm .gt_indent_2 {
## text-indent: 10px;
## }
##
## #ekbuzvlltm .gt_indent_3 {
## text-indent: 15px;
## }
##
## #ekbuzvlltm .gt_indent_4 {
## text-indent: 20px;
## }
##
## #ekbuzvlltm .gt_indent_5 {
## text-indent: 25px;
## }
##
## #ekbuzvlltm .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #ekbuzvlltm div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>gloves vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">gloves</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.8</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">90 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">106 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">196 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">4 (40%)</td>
## <td headers="stat_2" class="gt_row gt_center">6 (60%)</td>
## <td headers="stat_0" class="gt_row gt_center">10 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Fisher’s exact test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[23]]
## <div id="eewzdtcqlr" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#eewzdtcqlr table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #eewzdtcqlr thead, #eewzdtcqlr tbody, #eewzdtcqlr tfoot, #eewzdtcqlr tr, #eewzdtcqlr td, #eewzdtcqlr th {
## border-style: none;
## }
##
## #eewzdtcqlr p {
## margin: 0;
## padding: 0;
## }
##
## #eewzdtcqlr .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #eewzdtcqlr .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #eewzdtcqlr .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #eewzdtcqlr .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #eewzdtcqlr .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #eewzdtcqlr .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #eewzdtcqlr .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #eewzdtcqlr .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #eewzdtcqlr .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #eewzdtcqlr .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #eewzdtcqlr .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #eewzdtcqlr .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #eewzdtcqlr .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #eewzdtcqlr .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #eewzdtcqlr .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #eewzdtcqlr .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #eewzdtcqlr .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #eewzdtcqlr .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #eewzdtcqlr .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #eewzdtcqlr .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #eewzdtcqlr .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #eewzdtcqlr .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #eewzdtcqlr .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #eewzdtcqlr .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #eewzdtcqlr .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #eewzdtcqlr .gt_left {
## text-align: left;
## }
##
## #eewzdtcqlr .gt_center {
## text-align: center;
## }
##
## #eewzdtcqlr .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #eewzdtcqlr .gt_font_normal {
## font-weight: normal;
## }
##
## #eewzdtcqlr .gt_font_bold {
## font-weight: bold;
## }
##
## #eewzdtcqlr .gt_font_italic {
## font-style: italic;
## }
##
## #eewzdtcqlr .gt_super {
## font-size: 65%;
## }
##
## #eewzdtcqlr .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #eewzdtcqlr .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #eewzdtcqlr .gt_indent_1 {
## text-indent: 5px;
## }
##
## #eewzdtcqlr .gt_indent_2 {
## text-indent: 10px;
## }
##
## #eewzdtcqlr .gt_indent_3 {
## text-indent: 15px;
## }
##
## #eewzdtcqlr .gt_indent_4 {
## text-indent: 20px;
## }
##
## #eewzdtcqlr .gt_indent_5 {
## text-indent: 25px;
## }
##
## #eewzdtcqlr .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #eewzdtcqlr div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>regular vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">regular</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.073</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">86 (48%)</td>
## <td headers="stat_2" class="gt_row gt_center">93 (52%)</td>
## <td headers="stat_0" class="gt_row gt_center">179 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">8 (30%)</td>
## <td headers="stat_2" class="gt_row gt_center">19 (70%)</td>
## <td headers="stat_0" class="gt_row gt_center">27 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>
##
## [[24]]
## <div id="txidlekoha" style="padding-left:0px;padding-right:0px;padding-top:10px;padding-bottom:10px;overflow-x:auto;overflow-y:auto;width:auto;height:auto;">
## <style>#txidlekoha table {
## font-family: system-ui, 'Segoe UI', Roboto, Helvetica, Arial, sans-serif, 'Apple Color Emoji', 'Segoe UI Emoji', 'Segoe UI Symbol', 'Noto Color Emoji';
## -webkit-font-smoothing: antialiased;
## -moz-osx-font-smoothing: grayscale;
## }
##
## #txidlekoha thead, #txidlekoha tbody, #txidlekoha tfoot, #txidlekoha tr, #txidlekoha td, #txidlekoha th {
## border-style: none;
## }
##
## #txidlekoha p {
## margin: 0;
## padding: 0;
## }
##
## #txidlekoha .gt_table {
## display: table;
## border-collapse: collapse;
## line-height: normal;
## margin-left: auto;
## margin-right: auto;
## color: #333333;
## font-size: 16px;
## font-weight: normal;
## font-style: normal;
## background-color: #FFFFFF;
## width: auto;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #A8A8A8;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #A8A8A8;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## }
##
## #txidlekoha .gt_caption {
## padding-top: 4px;
## padding-bottom: 4px;
## }
##
## #txidlekoha .gt_title {
## color: #333333;
## font-size: 125%;
## font-weight: initial;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-color: #FFFFFF;
## border-bottom-width: 0;
## }
##
## #txidlekoha .gt_subtitle {
## color: #333333;
## font-size: 85%;
## font-weight: initial;
## padding-top: 3px;
## padding-bottom: 5px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-color: #FFFFFF;
## border-top-width: 0;
## }
##
## #txidlekoha .gt_heading {
## background-color: #FFFFFF;
## text-align: center;
## border-bottom-color: #FFFFFF;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #txidlekoha .gt_bottom_border {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #txidlekoha .gt_col_headings {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## }
##
## #txidlekoha .gt_col_heading {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 6px;
## padding-left: 5px;
## padding-right: 5px;
## overflow-x: hidden;
## }
##
## #txidlekoha .gt_column_spanner_outer {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: normal;
## text-transform: inherit;
## padding-top: 0;
## padding-bottom: 0;
## padding-left: 4px;
## padding-right: 4px;
## }
##
## #txidlekoha .gt_column_spanner_outer:first-child {
## padding-left: 0;
## }
##
## #txidlekoha .gt_column_spanner_outer:last-child {
## padding-right: 0;
## }
##
## #txidlekoha .gt_column_spanner {
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: bottom;
## padding-top: 5px;
## padding-bottom: 5px;
## overflow-x: hidden;
## display: inline-block;
## width: 100%;
## }
##
## #txidlekoha .gt_spanner_row {
## border-bottom-style: hidden;
## }
##
## #txidlekoha .gt_group_heading {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## text-align: left;
## }
##
## #txidlekoha .gt_empty_group_heading {
## padding: 0.5px;
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## vertical-align: middle;
## }
##
## #txidlekoha .gt_from_md > :first-child {
## margin-top: 0;
## }
##
## #txidlekoha .gt_from_md > :last-child {
## margin-bottom: 0;
## }
##
## #txidlekoha .gt_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## margin: 10px;
## border-top-style: solid;
## border-top-width: 1px;
## border-top-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 1px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 1px;
## border-right-color: #D3D3D3;
## vertical-align: middle;
## overflow-x: hidden;
## }
##
## #txidlekoha .gt_stub {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #txidlekoha .gt_stub_row_group {
## color: #333333;
## background-color: #FFFFFF;
## font-size: 100%;
## font-weight: initial;
## text-transform: inherit;
## border-right-style: solid;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## padding-left: 5px;
## padding-right: 5px;
## vertical-align: top;
## }
##
## #txidlekoha .gt_row_group_first td {
## border-top-width: 2px;
## }
##
## #txidlekoha .gt_row_group_first th {
## border-top-width: 2px;
## }
##
## #txidlekoha .gt_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #txidlekoha .gt_first_summary_row {
## border-top-style: solid;
## border-top-color: #D3D3D3;
## }
##
## #txidlekoha .gt_first_summary_row.thick {
## border-top-width: 2px;
## }
##
## #txidlekoha .gt_last_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #txidlekoha .gt_grand_summary_row {
## color: #333333;
## background-color: #FFFFFF;
## text-transform: inherit;
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #txidlekoha .gt_first_grand_summary_row {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-top-style: double;
## border-top-width: 6px;
## border-top-color: #D3D3D3;
## }
##
## #txidlekoha .gt_last_grand_summary_row_top {
## padding-top: 8px;
## padding-bottom: 8px;
## padding-left: 5px;
## padding-right: 5px;
## border-bottom-style: double;
## border-bottom-width: 6px;
## border-bottom-color: #D3D3D3;
## }
##
## #txidlekoha .gt_striped {
## background-color: rgba(128, 128, 128, 0.05);
## }
##
## #txidlekoha .gt_table_body {
## border-top-style: solid;
## border-top-width: 2px;
## border-top-color: #D3D3D3;
## border-bottom-style: solid;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## }
##
## #txidlekoha .gt_footnotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #txidlekoha .gt_footnote {
## margin: 0px;
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #txidlekoha .gt_sourcenotes {
## color: #333333;
## background-color: #FFFFFF;
## border-bottom-style: none;
## border-bottom-width: 2px;
## border-bottom-color: #D3D3D3;
## border-left-style: none;
## border-left-width: 2px;
## border-left-color: #D3D3D3;
## border-right-style: none;
## border-right-width: 2px;
## border-right-color: #D3D3D3;
## }
##
## #txidlekoha .gt_sourcenote {
## font-size: 90%;
## padding-top: 4px;
## padding-bottom: 4px;
## padding-left: 5px;
## padding-right: 5px;
## }
##
## #txidlekoha .gt_left {
## text-align: left;
## }
##
## #txidlekoha .gt_center {
## text-align: center;
## }
##
## #txidlekoha .gt_right {
## text-align: right;
## font-variant-numeric: tabular-nums;
## }
##
## #txidlekoha .gt_font_normal {
## font-weight: normal;
## }
##
## #txidlekoha .gt_font_bold {
## font-weight: bold;
## }
##
## #txidlekoha .gt_font_italic {
## font-style: italic;
## }
##
## #txidlekoha .gt_super {
## font-size: 65%;
## }
##
## #txidlekoha .gt_footnote_marks {
## font-size: 75%;
## vertical-align: 0.4em;
## position: initial;
## }
##
## #txidlekoha .gt_asterisk {
## font-size: 100%;
## vertical-align: 0;
## }
##
## #txidlekoha .gt_indent_1 {
## text-indent: 5px;
## }
##
## #txidlekoha .gt_indent_2 {
## text-indent: 10px;
## }
##
## #txidlekoha .gt_indent_3 {
## text-indent: 15px;
## }
##
## #txidlekoha .gt_indent_4 {
## text-indent: 20px;
## }
##
## #txidlekoha .gt_indent_5 {
## text-indent: 25px;
## }
##
## #txidlekoha .katex-display {
## display: inline-flex !important;
## margin-bottom: 0.75em !important;
## }
##
## #txidlekoha div.Reactable > div.rt-table > div.rt-thead > div.rt-tr.rt-tr-group-header > div.rt-th-group:after {
## height: 0px !important;
## }
## </style>
## <table class="gt_table" data-quarto-disable-processing="false" data-quarto-bootstrap="false">
## <caption><span class='gt_from_md'><strong>clean_shed vs. zoonotic_awarenes</strong></span></caption>
## <thead>
## <tr class="gt_col_headings gt_spanner_row">
## <th class="gt_col_heading gt_columns_bottom_border gt_left" rowspan="2" colspan="1" scope="col" id="label"></th>
## <th class="gt_center gt_columns_top_border gt_column_spanner_outer" rowspan="1" colspan="2" scope="colgroup" id="level 1; stat_1">
## <div class="gt_column_spanner"><span class='gt_from_md'><strong>zoonotic_awarenes</strong></span></div>
## </th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="stat_0"><span class='gt_from_md'><strong>Total</strong></span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="2" colspan="1" scope="col" id="p.value"><span class='gt_from_md'><strong>p-value</strong></span><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span></th>
## </tr>
## <tr class="gt_col_headings">
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_1"><span class='gt_from_md'>no</span></th>
## <th class="gt_col_heading gt_columns_bottom_border gt_center" rowspan="1" colspan="1" scope="col" id="stat_2"><span class='gt_from_md'>yes</span></th>
## </tr>
## </thead>
## <tbody class="gt_table_body">
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">clean_shed</td>
## <td headers="stat_1" class="gt_row gt_center"><br /></td>
## <td headers="stat_2" class="gt_row gt_center"><br /></td>
## <td headers="stat_0" class="gt_row gt_center"><br /></td>
## <td headers="p.value" class="gt_row gt_center">0.13</td></tr>
## <tr><td headers="label" class="gt_row gt_left"> No</td>
## <td headers="stat_1" class="gt_row gt_center">22 (56%)</td>
## <td headers="stat_2" class="gt_row gt_center">17 (44%)</td>
## <td headers="stat_0" class="gt_row gt_center">39 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left"> Yes</td>
## <td headers="stat_1" class="gt_row gt_center">72 (43%)</td>
## <td headers="stat_2" class="gt_row gt_center">95 (57%)</td>
## <td headers="stat_0" class="gt_row gt_center">167 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## <tr><td headers="label" class="gt_row gt_left" style="font-weight: bold;">Total</td>
## <td headers="stat_1" class="gt_row gt_center">94 (46%)</td>
## <td headers="stat_2" class="gt_row gt_center">112 (54%)</td>
## <td headers="stat_0" class="gt_row gt_center">206 (100%)</td>
## <td headers="p.value" class="gt_row gt_center"><br /></td></tr>
## </tbody>
##
## <tfoot class="gt_footnotes">
## <tr>
## <td class="gt_footnote" colspan="5"><span class="gt_footnote_marks" style="white-space:nowrap;font-style:italic;font-weight:normal;line-height:0;"><sup>1</sup></span> <span class='gt_from_md'>Pearson’s Chi-squared test</span></td>
## </tr>
## </tfoot>
## </table>
## </div>