Exploratory Data Analysis - Insights from global dental educators about chatGPT and AI Chatbots
Author
Sergio Uribe
Published
August 6, 2023
Modified
June 28, 2023
Load clean dataset
Rows: 428 Columns: 34
── Column specification ────────────────────────────────────────────────────────
Delimiter: ","
chr (21): Gender, What is your current country of residence?, Area speciali...
dbl (11): ...1, Age, Year Experience, how would you rate your current knowl...
dttm (2): Response started, Response completed
ℹ Use `spec()` to retrieve the full column specification for this data.
ℹ Specify the column types or set `show_col_types = FALSE` to quiet this message.
Add the continent detailed
IMF classification
EDA
[1] 428 36
Hiow many countries?
[1] 66
Table 1
Characteristic
N = 4281
Age
45 (37, 56)
Year Experience
16 (8, 25)
Gender
Female
226 (53%)
Male
200 (47%)
Prefer not to say/Non-binary
2 (0.5%)
Country
Argentina
14 (3.3%)
Brazil
11 (2.6%)
Chile
65 (15%)
Colombia
14 (3.3%)
Egypt
17 (4.0%)
France
15 (3.5%)
India
10 (2.3%)
Latvia
13 (3.0%)
Lithuania
11 (2.6%)
Mexico
11 (2.6%)
Spain
11 (2.6%)
United Kingdom
16 (3.7%)
United States
89 (21%)
Venezuela
10 (2.3%)
Other
121 (28%)
UN Classification
Australia and New Zealand
13 (3.0%)
Eastern Asia
7 (1.6%)
Eastern Europe
4 (0.9%)
Latin America and the Caribbean
136 (32%)
Northern Africa
20 (4.7%)
Northern America
95 (22%)
Northern Europe
50 (12%)
South-eastern Asia
9 (2.1%)
Southern Asia
13 (3.0%)
Southern Europe
27 (6.3%)
Sub-Saharan Africa
11 (2.6%)
Western Asia
13 (3.0%)
Western Europe
30 (7.0%)
Continent
Africa
31 (7.2%)
Americas
231 (54%)
Asia
42 (9.8%)
Europe
111 (26%)
Oceania
13 (3.0%)
1 Median (IQR); n (%)
1. Current use of AI
Use of AI
n
percent
I don't know.
105
24.5%
No, we do not use AI-powered tools.
190
44.4%
Yes, we use AI-powered tools.
133
31.1%
Cross check to verify if understand turnitin is a AI tool
AI_use
No
Not sure
Yes
I don't know.
61
7
37
No, we do not use AI-powered tools.
89
15
86
Yes, we use AI-powered tools.
42
4
87
Q8
The most frequently cited tools among users were ChatGPT, used for various tasks (24 mentions), and Turnitin, a plagiarism detection software (14 mentions). Tools such as Grammarly, oral/intraoral scanners (e.g., 3Shape Automate, iTero), and teledentistry and IA dental solutions (e.g., Overjet, AI Dental RPD Design) were each mentioned three times. AI-powered CAD Design tools, the educational simulation tool Kahoot, and AI tools for radiographic support and diagnosis received fewer mentions. Other AI tools, including Quillbot, DeepL, and image stitching software, totaled six mentions.
how would you rate your current knowledge of AI-powered tools (such as ChatGPT) in education? (1 being very low and 5 being very high)
n
percent
1
124
29.0%
2
83
19.4%
3
134
31.3%
4
68
15.9%
5
19
4.4%
Min. 1st Qu. Median Mean 3rd Qu. Max.
1.000 1.000 3.000 2.474 3.000 5.000
2. Perceived impact of AI in dental education
believe AI can enhance dental education?
Min. 1st Qu. Median Mean 3rd Qu. Max.
1.000 3.000 4.000 3.801 5.000 5.000
believe AI can enhance dental education? (1 being not at all and 5 being greatly)
n
percent
1
11
0.0257009
2
22
0.0514019
3
122
0.2850467
4
159
0.3714953
5
114
0.2663551
believe AI can enhance dental education?
by continent
Continent
n
mean
sd
Europe
111
3.5
1.0
Africa
31
4.2
0.7
Americas
231
3.8
1.0
Asia
42
4.2
0.8
Oceania
13
3.6
1.4
Model by continent
Warning: Unknown levels in `f`: 5, 4, 3, 2, 1
Characteristic
N
OR1
95% CI1
p-value
Continent
426
Europe
—
—
Africa
6.37
2.43, 20.1
<0.001
Americas
2.72
1.68, 4.45
<0.001
Asia
3.86
1.73, 9.34
0.002
Oceania
2.00
0.62, 7.08
0.3
Age
426
0.98
0.96, 1.00
0.024
Gender
426
Female
—
—
Male
1.57
1.02, 2.42
0.041
1 OR = Odds Ratio, CI = Confidence Interval
We fitted a logistic model (estimated using ML) to predict AI_enhance with
Continent (formula: AI_enhance ~ Continent + Age + Gender). The model's
explanatory power is weak (Tjur's R2 = 0.08). The model's intercept,
corresponding to Continent = Europe, is at 0.53 (95% CI [-0.30, 1.36], p =
0.210). Within this model:
- The effect of Continent [Africa] is statistically significant and positive
(beta = 1.85, 95% CI [0.89, 3.00], p < .001; Std. beta = 1.85, 95% CI [0.89,
3.00])
- The effect of Continent [Americas] is statistically significant and positive
(beta = 1.00, 95% CI [0.52, 1.49], p < .001; Std. beta = 1.00, 95% CI [0.52,
1.49])
- The effect of Continent [Asia] is statistically significant and positive
(beta = 1.35, 95% CI [0.55, 2.23], p = 0.002; Std. beta = 1.35, 95% CI [0.55,
2.23])
- The effect of Continent [Oceania] is statistically non-significant and
positive (beta = 0.69, 95% CI [-0.48, 1.96], p = 0.254; Std. beta = 0.69, 95%
CI [-0.48, 1.96])
- The effect of Age is statistically significant and negative (beta = -0.02,
95% CI [-0.04, -2.77e-03], p = 0.024; Std. beta = -0.26, 95% CI [-0.48, -0.04])
- The effect of Gender [Male] is statistically significant and positive (beta =
0.45, 95% CI [0.02, 0.88], p = 0.041; Std. beta = 0.45, 95% CI [0.02, 0.88])
Standardized parameters were obtained by fitting the model on a standardized
version of the dataset. 95% Confidence Intervals (CIs) and p-values were
computed using a Wald z-distribution approximation., We fitted a logistic model
(estimated using ML) to predict AI_enhance with Age (formula: AI_enhance ~
Continent + Age + Gender). The model's explanatory power is weak (Tjur's R2 =
0.08). The model's intercept, corresponding to Age = 0, is at 0.53 (95% CI
[-0.30, 1.36], p = 0.210). Within this model:
- The effect of Continent [Africa] is statistically significant and positive
(beta = 1.85, 95% CI [0.89, 3.00], p < .001; Std. beta = 1.85, 95% CI [0.89,
3.00])
- The effect of Continent [Americas] is statistically significant and positive
(beta = 1.00, 95% CI [0.52, 1.49], p < .001; Std. beta = 1.00, 95% CI [0.52,
1.49])
- The effect of Continent [Asia] is statistically significant and positive
(beta = 1.35, 95% CI [0.55, 2.23], p = 0.002; Std. beta = 1.35, 95% CI [0.55,
2.23])
- The effect of Continent [Oceania] is statistically non-significant and
positive (beta = 0.69, 95% CI [-0.48, 1.96], p = 0.254; Std. beta = 0.69, 95%
CI [-0.48, 1.96])
- The effect of Age is statistically significant and negative (beta = -0.02,
95% CI [-0.04, -2.77e-03], p = 0.024; Std. beta = -0.26, 95% CI [-0.48, -0.04])
- The effect of Gender [Male] is statistically significant and positive (beta =
0.45, 95% CI [0.02, 0.88], p = 0.041; Std. beta = 0.45, 95% CI [0.02, 0.88])
Standardized parameters were obtained by fitting the model on a standardized
version of the dataset. 95% Confidence Intervals (CIs) and p-values were
computed using a Wald z-distribution approximation. and We fitted a logistic
model (estimated using ML) to predict AI_enhance with Gender (formula:
AI_enhance ~ Continent + Age + Gender). The model's explanatory power is weak
(Tjur's R2 = 0.08). The model's intercept, corresponding to Gender = Female, is
at 0.53 (95% CI [-0.30, 1.36], p = 0.210). Within this model:
- The effect of Continent [Africa] is statistically significant and positive
(beta = 1.85, 95% CI [0.89, 3.00], p < .001; Std. beta = 1.85, 95% CI [0.89,
3.00])
- The effect of Continent [Americas] is statistically significant and positive
(beta = 1.00, 95% CI [0.52, 1.49], p < .001; Std. beta = 1.00, 95% CI [0.52,
1.49])
- The effect of Continent [Asia] is statistically significant and positive
(beta = 1.35, 95% CI [0.55, 2.23], p = 0.002; Std. beta = 1.35, 95% CI [0.55,
2.23])
- The effect of Continent [Oceania] is statistically non-significant and
positive (beta = 0.69, 95% CI [-0.48, 1.96], p = 0.254; Std. beta = 0.69, 95%
CI [-0.48, 1.96])
- The effect of Age is statistically significant and negative (beta = -0.02,
95% CI [-0.04, -2.77e-03], p = 0.024; Std. beta = -0.26, 95% CI [-0.48, -0.04])
- The effect of Gender [Male] is statistically significant and positive (beta =
0.45, 95% CI [0.02, 0.88], p = 0.041; Std. beta = 0.45, 95% CI [0.02, 0.88])
Standardized parameters were obtained by fitting the model on a standardized
version of the dataset. 95% Confidence Intervals (CIs) and p-values were
computed using a Wald z-distribution approximation.
By UN region
UN Classification
n
Mean
SD
Western Europe
30
3.5
0.9
Eastern Europe
4
4.2
1.0
Northern Europe
50
3.6
1.1
Southern Europe
27
3.4
0.7
Northern America
95
3.7
1.1
Latin America and the Caribbean
136
3.9
0.9
Northern Africa
20
4.2
0.7
Sub-Saharan Africa
11
4.2
0.8
Eastern Asia
7
3.9
0.9
South-eastern Asia
9
4.2
0.4
Southern Asia
13
4.2
0.8
Western Asia
13
4.4
0.9
Australia and New Zealand
13
3.6
1.4
“What dental education areas could be most enhanced by AI-powered tools? ()”
Areas_enhace
n
porcentaje
Knowledge acquisition
318
74.29907
Research
293
68.45794
Clinical decision making
272
63.55140
Assessment
257
60.04673
Clinical skills training
166
38.78505
Other
43
10.04673
3. Perceived barriers to the use of AI chatbots in dental education
Relabel and relevel
Likert barriers table
item
Completely Disagree
Disagree
Neutral
Agree
Completely Agree
AI tools are easy to use.
10
44
182
134
58
AI tools can accurately assess students' skills.
43
126
141
89
29
AI tools can replace traditional teaching methods.
98
117
103
81
29
The benefits of using AI tools outweigh the costs.
12
52
188
125
51
There is adequate support and training for AI tools.
91
163
126
37
11
in Likert format
4. Future of AI chatbots in dental education
comfortable_assessment
n
percent
1
22
5.1%
2
79
18.5%
3
158
36.9%
4
115
26.9%
5
54
12.6%
Min. 1st Qu. Median Mean 3rd Qu. Max.
1.000 3.000 3.000 3.234 4.000 5.000
20 “What concerns, if any, do you have regarding AI-powered tools’ involvement in student evaluations and assessments? ()”
concerns
n
percent
AI tools may not assess critical thinking and creativity effectively
275
32.5%
AI tools may not accurately evaluate students' skills
190
22.5%
There may be a lack of human touch in AI assessment
176
20.8%
Concerns about data privacy and security
134
15.9%
Other
37
4.4%
No concerns
33
3.9%
21 “What potential benefits can AI-powered tools bring to dental education’s evaluation and assessment process? ()”
benefits
n
percent
Increased efficiency in marking and feedback
296
35.5%
Consistency in assessment
274
32.9%
Personalized feedback based on student's performance
233
27.9%
Other
31
3.7%
22 “What changes should be made in the current evaluation and assessment process to accommodate the involvement of AI-powered tools better? ()”
changes
n
percent
More training for educators on how to use AI tools
386
35.2%
Clear guidelines on how AI tools should be used for evaluation
369
33.7%
Inclusion of AI tools in the curriculum
270
24.6%
Less essay
37
3.4%
Other
34
3.1%
5. Perceptions impact
# A tibble: 7 × 6
# Groups: item [7]
item Stron…¹ Disag…² Neutral Agree Stron…³
<chr> <int> <int> <int> <int> <int>
1 " AI tools like ChatGPT will significa… 22 51 154 119 42
2 " AI tools like ChatGPT will impact ass… 6 19 123 175 65
3 " AI tools like ChatGPT will likely lea… 13 62 131 120 62
4 "ChatGPT enhance critical thinking skil… 41 101 144 82 20
5 "ChatGPT result in an efficient grading… 14 39 137 164 34
6 "ChatGPT result in improved student eng… 28 63 142 122 33
7 "ChatGPTreduce human interaction and fe… 10 61 108 151 58
# … with abbreviated variable names ¹`Strongly Disagree`, ²Disagree,
# ³`Strongly Agree`
In likert format:
Warning: Values from `value` are not uniquely identified; output will contain list-cols.
* Use `values_fn = list` to suppress this warning.
* Use `values_fn = {summary_fun}` to summarise duplicates.
* Use the following dplyr code to identify duplicates.
{data} %>%
dplyr::group_by(id, item) %>%
dplyr::summarise(n = dplyr::n(), .groups = "drop") %>%
dplyr::filter(n > 1L)
Warning: `cols` is now required when using unnest().
Please use `cols = c(` AI tools like ChatGPT will impact assessment methods in dental education`,
` AI tools like ChatGPT will significantly increase oral examinations in dental education`,
` AI tools like ChatGPT will likely lead to a decrease in essay assignments in dental education`,
`ChatGPT result in improved student engagement.`, `ChatGPT enhance critical thinking skills of students.`,
`ChatGPT result in an efficient grading and feedback process.`,
`ChatGPTreduce human interaction and feedback.`)`
Some correlations
Age and AI_enhance
Role and AI_enhance
dataMaid
Store the names as labels
First regularize the names
Shorten the names
Make the Codebook
Source Code
---title: "Exploratory Data Analysis - Insights from global dental educators about chatGPT and AI Chatbots"author: "Sergio Uribe"date: 08/06/2023date-modified: last-modifiedformat: html: toc: true toc-expand: 3 code-fold: true code-tools: trueeditor: visualexecute: echo: false---```{r}pacman::p_load(tidyverse, # data wrangling tools countrycode, kableExtra, # for the tables janitor, # data cleaning wordcloud, # for the wordcloud RColorBrewer, # color palette viridis, # color palette report, correlationfunnel, # to find some correlations skimr, # for EDA ggbreak, # for y axis in ggplot2 here, # folder scales, # for scales axis likert, # for the likert plots sjPlot, # for likert plots gtsummary) # for summary and regression report``````{r}theme_set(theme_minimal())```# Load clean dataset```{r}df <-read_csv(here("data", "df.csv"))```## Add the continent detailedIMF classification```{r}df$imf_classification <-countrycode(df$Country_name, origin ="country.name", destination ="imf")``````{r}df$un_classification <-countrycode(df$Country, origin ="iso3c", destination ="un.regionsub.name")```# EDA```{r}dim(df)``````{r}# glimpse(df)```Hiow many countries?```{r}n_distinct(df$Country_name)```## Table 1```{r}df %>%mutate(Country_name =fct_lump_min(Country_name, min =10)) %>%select(Age, `Year Experience`, Gender, "Country"= Country_name,"UN Classification"= un_classification, Continent) %>% gtsummary::tbl_summary() %>%bold_labels()```## 1. Current use of AI```{r}df %>%rename("Use of AI"="Are you aware of any AI-powered tools being used in your educational institution?") %>%tabyl("Use of AI") %>%adorn_pct_formatting() %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```Cross check to verify if understand turnitin *is* a AI tool```{r}df %>%rename(AI_use ="Are you aware of any AI-powered tools being used in your educational institution?", "Turnitin"="Have you employed Turnitin or other plagiarism detection software to check academic integrity?") %>%tabyl(AI_use, Turnitin) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)``````{r}df %>%rename(AI_use ="Are you aware of any AI-powered tools being used in your educational institution?", "Turnitin"="Have you employed Turnitin or other plagiarism detection software to check academic integrity?") %>%with(mosaicplot(table(.$AI_use, .$Turnitin)), shade = T)```### Q8 The most frequently cited tools among users were ChatGPT, used for various tasks (24 mentions), and Turnitin, a plagiarism detection software (14 mentions). Tools such as Grammarly, oral/intraoral scanners (e.g., 3Shape Automate, iTero), and teledentistry and IA dental solutions (e.g., Overjet, AI Dental RPD Design) were each mentioned three times. AI-powered CAD Design tools, the educational simulation tool Kahoot, and AI tools for radiographic support and diagnosis received fewer mentions. Other AI tools, including Quillbot, DeepL, and image stitching software, totaled six mentions.```{r}df %>%tabyl(`how would you rate your current knowledge of AI-powered tools (such as ChatGPT) in education? (1 being very low and 5 being very high)`) %>%adorn_pct_formatting() %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)``````{r}summary(df$`how would you rate your current knowledge of AI-powered tools (such as ChatGPT) in education? (1 being very low and 5 being very high)`)```## 2. Perceived impact of AI in dental education### believe AI can enhance dental education?```{r}summary(df$`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`)``````{r}df %>%tabyl(`believe AI can enhance dental education? (1 being not at all and 5 being greatly)` ) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```### believe AI can enhance dental education?#### by continent```{r}df %>%select(Continent,`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`, Age) %>%mutate(Continent =fct_relevel(Continent, "Europe" )) %>%group_by(Continent) %>%summarise(n =n(), mean =mean(`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`), sd =sd(`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`)) %>%mutate(across(c(mean, sd), round, 1)) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```#### Model by continent```{r}model1 <- df %>%filter(Gender %in%c("Male", "Female")) %>%rename(AI_enhance =`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%mutate(Continent =fct_relevel(Continent, "Europe" )) %>%mutate(AI_enhance =as.factor(AI_enhance)) %>%mutate(AI_enhance =fct_collapse(AI_enhance, "Better"=c("5", "4"), "Neutral or no impact"=c("3", "2", "1"))) %>%mutate(AI_enhance = forcats::fct_recode(AI_enhance, "Better"="5", "Better"="4", "Neutral or no impact"="3", "Neutral or no impact"="2", "Neutral or no impact"="1")) %>%with(glm(AI_enhance ~ Continent + Age + Gender, family = binomial, data = .)) ``````{r}model1 %>% gtsummary::tbl_regression(exponentiate =TRUE) %>%bold_labels() %>%add_n()``````{r}report(model1)``````{r}df %>%rename(AI_enhance =`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%mutate(Continent =fct_relevel(Continent, "Europe" )) %>%ggplot(aes(x =fct_reorder(Continent, AI_enhance), y = AI_enhance)) +geom_violin(alpha = .2) +geom_boxplot(width = .1) +geom_jitter(alpha = .2) ```#### By UN region```{r}regions <-c("Eastern Europe","Northern Europe","Southern Europe","Western Europe","Northern America","Latin America and the Caribbean","Northern Africa","Sub-Saharan Africa","Eastern Asia","South-eastern Asia","Southern Asia","Western Asia","Australia and New Zealand")df$un_classification <-fct_relevel(df$un_classification, regions)rm(regions)``````{r}df %>%select(un_classification,`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%mutate(un_classification =fct_relevel(un_classification, "Western Europe" )) %>%group_by(un_classification) %>%summarise(n =n(), mean =mean(`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`), sd =sd(`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`)) %>%mutate(across(c(mean, sd), round, 1)) %>%rename("UN Classification"="un_classification", "Mean"="mean", "SD"="sd") %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F) ``````{r}# df %>%# rename(AI_enhance = `believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%# mutate(Continent = fct_relevel(un_classification, "Western Europe" )) %>% # mutate(AI_enhance = as.factor(AI_enhance)) %>%# mutate(AI_enhance = fct_collapse(AI_enhance, # "Better" = c("5", "4"), # "Neutral or no impact" = c("3", "2", "1"))) %>% # mutate(AI_enhance = forcats::fct_recode(AI_enhance, # "Better" = "5", # "Better" = "4", # "Neutral or no impact" = "3", # "Neutral or no impact" = "2", # "Neutral or no impact" = "1")) %>% # with(glm(AI_enhance ~ un_classification, family = binomial, data = .)) %>% # gtsummary::tbl_regression(exponentiate = TRUE) ```### "What dental education areas could be most enhanced by AI-powered tools? ()"```{r}df %>%select(...1, "Areas_enhace"="What dental education areas could be most enhanced by AI-powered tools? ()") %>%separate_rows(Areas_enhace, sep =",") %>%mutate(Areas_enhace =ifelse(grepl("Other \\(Please specify\\)", Areas_enhace) |is.na(Areas_enhace), "Other", Areas_enhace)) %>%group_by(Areas_enhace) %>%count() %>%mutate(porcentaje = n /nrow(df) *100) %>%arrange(desc(n)) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```## 3. Perceived barriers to the use of AI chatbots in dental education```{r, warning=FALSE, error=FALSE}likert_barriers <- df %>%select(# ...1, # try removing this data, check afterwards"(1 Disagree - 5 +Agree) [AI tools are easy to use.]":"(1 Disagree - 5 +Agree) [AI tools can accurately assess students' skills.]" ) %>%pivot_longer("(1 Disagree - 5 +Agree) [AI tools are easy to use.]":"(1 Disagree - 5 +Agree) [AI tools can accurately assess students' skills.]" ,names_to ="item",values_to ="value" ) %>%mutate(item =str_replace_all(item, "\\([0-9A-Za-z+\\- ]+\\)", "")) %>%mutate(item =str_remove_all(item, "\\[\\]")) %>%mutate(item =str_replace_all(item, "\\([^()]+\\)", "")) %>%mutate(item =str_remove_all(item, "\\[|\\]"))```Relabel and relevel```{r, warning=FALSE, error=FALSE}likert_barriers <- likert_barriers %>%mutate(value =case_when( value ==1~"Completely Disagree", value ==2~"Disagree", value ==3~"Neutral", value ==4~"Agree", value ==5~"Completely Agree" ) ) %>%mutate(value =fct_relevel( value,"Completely Disagree","Disagree","Neutral","Agree","Completely Agree" ) ) ```### Likert barriers table```{r}likert_barriers %>%group_by(item, value) %>%count() %>%pivot_wider(names_from = value, values_from = n) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```in Likert format```{r, warning=FALSE, error=FALSE}likert_barriers <- likert_barriers %>%pivot_wider(names_from = item) %>%# select(-...1) %>%unnest() ``````{r}likert_barriers %>%plot_likert(grid.range =1.3,geom.colors ="RdBu",cat.neutral =3,show.n =FALSE, # wrap.labels = 40, # show.legend = TRUE, # legend.pos = "bottom",reverse.scale =TRUE,expand.grid =FALSE,values ="sum.outside",show.prc.sign =TRUE ) +labs(title ="Perceived barriers to the use of AI chatbots in dental education") +theme_minimal() +guides(fill =guide_legend(reverse =TRUE))``````{r}ggsave(here("figures", "fig_02_likert_barriers.tiff"), width =30, height =12, units ="cm", dpi =300)ggsave(here("figures", "fig_02_likert_barriers.png"), width =30, height =12, units ="cm", dpi =300)``````{r}rm(likert_barriers)```## 4. Future of AI chatbots in dental education```{r}df %>%select("comfortable_assessment"="how comfortable are you with AI-powered tools being involved in the evaluation and assessment process?") %>%tabyl(comfortable_assessment) %>%adorn_pct_formatting() %>%kbl() %>%# kable_styling() %>%kable_classic(full_width = F)``````{r}summary(df$`how comfortable are you with AI-powered tools being involved in the evaluation and assessment process?`)``````{r}df %>%rename("comfortable_assessment"="how comfortable are you with AI-powered tools being involved in the evaluation and assessment process?") %>%# tabyl(comfortable_assessment) %>% ggplot(aes(x = comfortable_assessment)) +geom_histogram(bins =5) +scale_x_continuous(breaks =c(1,2,3,4,5), labels =c("1\nVery uncomfortable","2","3","4","5\nVery comfortable")) +labs(title ="How comfortable are you with AI-powered tools being involved in the evaluation and assessment process?", x ="", y ="Count")```### 20 "What concerns, if any, do you have regarding AI-powered tools' involvement in student evaluations and assessments? ()"```{r}df %>%select(id ="...1", "concerns"="What concerns, if any, do you have regarding AI-powered tools' involvement in student evaluations and assessments? ()") %>%separate_rows(concerns, sep =",") %>%mutate(concerns =ifelse(grepl("Other \\(Please specify\\)", concerns) |grepl("systemic", concerns) |grepl("misjudged", concerns) |grepl("feelings", concerns) |grepl("undocumented", concerns) |grepl("sounds", concerns) |is.na(concerns),"Other", concerns )) %>%tabyl(concerns) %>%adorn_pct_formatting() %>%arrange(desc(n)) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```### 21 "What potential benefits can AI-powered tools bring to dental education's evaluation and assessment process? ()"```{r}df %>%select(id ="...1", "benefits"="What potential benefits can AI-powered tools bring to dental education's evaluation and assessment process? ()") %>%separate_rows(benefits, sep =",") %>%mutate(benefits =ifelse(grepl("Other \\(Please specify\\)", benefits) |grepl("algorithms", benefits) |is.na(benefits),"Other", benefits )) %>%tabyl(benefits) %>%adorn_pct_formatting() %>%arrange(desc(n)) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```### 22 "What changes should be made in the current evaluation and assessment process to accommodate the involvement of AI-powered tools better? ()"```{r}df %>%select(id ="...1", "changes"="What changes should be made in the current evaluation and assessment process to accommodate the involvement of AI-powered tools better? ()" ) %>%separate_rows(changes, sep =",") %>%mutate(changes =ifelse(grepl("Other \\(Please specify\\)", changes) |grepl("developers", changes) |grepl("Seriously", changes) |is.na(changes),"Other", changes )) %>%tabyl(changes) %>%adorn_pct_formatting() %>%arrange(desc(n)) %>%kbl() %>%kable_styling() %>%kable_classic(full_width = F)```## 5. Perceptions impact```{r}likert_impact <- df %>%select(id = ...1,"Perception AssessmentPlease rate your level of agreement with the following statements [AI tools like ChatGPT will impact assessment methods in dental education]":"Perception Impact [ChatGPTreduce human interaction and feedback.]" ) %>%pivot_longer("Perception AssessmentPlease rate your level of agreement with the following statements [AI tools like ChatGPT will impact assessment methods in dental education]":"Perception Impact [ChatGPTreduce human interaction and feedback.]",names_to ="item",values_to ="value" ) %>%mutate(item =str_replace_all( item,c("Perception AssessmentPlease rate your level of agreement with the following statements"="","Perception Impact "="","\\["="","\\]"="" ) )) %>%mutate(item =str_replace_all(item, c("ChatGPTresult"="ChatGPT result", "ChatGPTenhance"="ChatGPT enhance"))) %>%filter(!is.na(value)) %>%mutate(value =fct_relevel( value,"Strongly Disagree","Disagree","Neutral","Agree","Strongly Agree" ) ) ``````{r}likert_impact %>%group_by(item, value) %>%count() %>%pivot_wider(names_from = value, values_from = n)```In likert format:```{r}likert_impact <- likert_impact %>%pivot_wider(names_from = item) %>%# select(-...1) %>%unnest() ``````{r}likert_impact %>%select(-id) %>%plot_likert(grid.range =1.3,geom.colors ="RdBu",cat.neutral =3,show.n =FALSE, # wrap.labels = 40, # show.legend = TRUE, # legend.pos = "bottom",reverse.scale =TRUE,expand.grid =FALSE,values ="sum.outside",show.prc.sign =TRUE ) +labs(title ="Perceived Impact of AI Tools on Student Engagement, Critical Thinking,\nGrading, and Interaction in Dental Education") +theme_minimal() +guides(fill =guide_legend(reverse =TRUE))```# Some correlations## Age and AI_enhance```{r}df %>%filter(Gender %in% (c("Male", "Female"))) %>%select(Age, Gender, Continent, AI_enhance =`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%ggplot(aes(x = Age, y = AI_enhance, color = Gender)) +geom_jitter() +facet_grid(Gender ~ Continent) ```## Role and AI_enhance```{r}df %>%# select(Role) %>% separate_rows(Role, sep =",") %>%mutate(Role =str_trim(Role, side ="both")) %>%select(Role, AI_enhance =`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%ggplot(aes(x = Role, y = AI_enhance)) +geom_jitter() +coord_flip()``````{r}df %>%# select(Role) %>% filter(Gender %in%c("Male", "Female")) %>%separate_rows(Role, sep =",") %>%mutate(Role =str_trim(Role, side ="both")) %>%select(Role, Gender, Continent, AI_enhance =`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%ggplot(aes(x = Role, y = AI_enhance, color = Gender)) +geom_boxplot() +geom_jitter(alpha = .2) +coord_flip()``````{r}df %>%# select(Role) %>% filter(Gender %in%c("Male", "Female")) %>%separate_rows(Role, sep =",") %>%mutate(Role =str_trim(Role, side ="both")) %>%select(Role, Gender, Continent, AI_enhance =`believe AI can enhance dental education? (1 being not at all and 5 being greatly)`) %>%ggplot(aes(x = Role, y = AI_enhance, color = Continent)) +geom_boxplot() +geom_jitter(alpha = .2) +coord_flip()```# dataMaid```{r}# pacman::p_load(dataMaid)``````{r}# df_anon <- read_csv(here("data", "anon_df.csv"))``````{r}# str(df_anon)```Store the names as labels```{r}# column_labels <- df_anon %>%# names() %>%# set_names()```First regularize the names```{r}# df_anon <- df_anon %>% # janitor::clean_names(parsing_option = 1)```Shorten the names```{r}# names(df_anon) <- substr(names(df_anon), 1, 30)```Make the Codebook```{r}# df_anon %>% # dataMaid::makeCodebook(file = here("codebook", "codebook.pdf"))```