Rows: 476 Columns: 9
── Column specification ────────────────────────────────────────────────────────
Delimiter: ","
chr (3): target, option, image
dbl (6): trial, img_idx, tgt_idx, sim_img_img, sim_img_txt, sim_txt_txt
ℹ 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.
Warning: Using `size` aesthetic for lines was deprecated in ggplot2 3.4.0.
ℹ Please use `linewidth` instead.
`geom_smooth()` using method = 'loess' and formula = 'y ~ x'
Warning: The following aesthetics were dropped during statistical transformation: size.
ℹ This can happen when ggplot fails to infer the correct grouping structure in
the data.
ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
variable into a factor?
library(purrr)library(jsonlite)
Attaching package: 'jsonlite'
The following object is masked from 'package:purrr':
flatten
Warning: The following aesthetics were dropped during statistical transformation: label.
ℹ This can happen when ggplot fails to infer the correct grouping structure in
the data.
ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
variable into a factor?
Warning: ggrepel: 38 unlabeled data points (too many overlaps). Consider
increasing max.overlaps
Spearman's rank correlation rho
data: garden_visvocab_corr_base$mean_value and garden_visvocab_corr_base$percent_correct
S = 32, p-value = 0.115
alternative hypothesis: true rho is not equal to 0
sample estimates:
rho
0.6190476
garden_multiple <- garden_with_sims |>count(targetWord, answerWord, sim_img_img, sim_img_txt, sim_txt_txt, name ="n") |>left_join(total_trials_full |>rename(total = n), by ="targetWord") |>mutate(pc = n / total)
garden_visvocab_error <- trial_summary_data_summarized |>inner_join(garden_error_patterns, by =c("Trials.targetImage"="targetWord", "Trials.distractorImage"="answerWord"))cor.test(garden_visvocab_error$mean_value, garden_visvocab_error$pc, method="spearman")
Warning in cor.test.default(garden_visvocab_error$mean_value,
garden_visvocab_error$pc, : Cannot compute exact p-value with ties
Spearman's rank correlation rho
data: garden_visvocab_error$mean_value and garden_visvocab_error$pc
S = 1028.8, p-value = 0.04219
alternative hypothesis: true rho is not equal to 0
sample estimates:
rho
-0.5128973
Warning: The following aesthetics were dropped during statistical transformation: label.
ℹ This can happen when ggplot fails to infer the correct grouping structure in
the data.
ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
variable into a factor?
Well, in a certain sense, our effects are getting stronger with age..restricting to 3 year olds.
total_trials_3 <- garden_with_sims |>filter(correct ==0& age_in_months <48) |>count(targetWord, name ="totalTargetTrials")total_trials_full_3 <- garden_with_sims |>count(targetWord)garden_error_patterns_3 <- garden_with_sims |>filter(correct ==0) |>filter(age_in_months <48) |>count(targetWord, answerWord, sim_img_img, sim_img_txt, sim_txt_txt, name ="n") |>left_join(total_trials_3, by ="targetWord") |>mutate(pc = n / totalTargetTrials)
garden_visvocab_error_3 <- trial_summary_data_summarized |>inner_join(garden_error_patterns_3, by =c("Trials.targetImage"="targetWord", "Trials.distractorImage"="answerWord"))cor.test(garden_visvocab_error_3$mean_value, garden_visvocab_error_3$pc, method="spearman")
Warning in cor.test.default(garden_visvocab_error_3$mean_value,
garden_visvocab_error_3$pc, : Cannot compute exact p-value with ties
Spearman's rank correlation rho
data: garden_visvocab_error_3$mean_value and garden_visvocab_error_3$pc
S = 857.27, p-value = 0.04175
alternative hypothesis: true rho is not equal to 0
sample estimates:
rho
-0.5308313
ggplot(garden_visvocab_error_3, aes(x=sim_img_img, y=pc, label=paste(Trials.targetImage, Trials.distractorImage, sep="-"))) +geom_jitter(alpha=0.4, size=4) + ggrepel::geom_label_repel() +geom_smooth(method="lm") + ggpubr::stat_cor() +xlab("Image similarity") +ylab("Percentage of errors") +labs(title="Error patterns for GARDEN 3-year-olds filtered to VisVocab stimuli")
`geom_smooth()` using formula = 'y ~ x'
Warning: The following aesthetics were dropped during statistical transformation: label.
ℹ This can happen when ggplot fails to infer the correct grouping structure in
the data.
ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
variable into a factor?
This is very clean. Lets see what new stimuli are good fits here..
Warning: The following aesthetics were dropped during statistical transformation: label.
ℹ This can happen when ggplot fails to infer the correct grouping structure in
the data.
ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
variable into a factor?
Warning: ggrepel: 238 unlabeled data points (too many overlaps). Consider
increasing max.overlaps
Warning: The following aesthetics were dropped during statistical transformation: label.
ℹ This can happen when ggplot fails to infer the correct grouping structure in
the data.
ℹ Did you forget to specify a `group` aesthetic or to convert a numerical
variable into a factor?