DATA_PATH <- here("data/processed/syntactic_bootstrapping_tidy_data.csv") # make all variables (i.e. things that might change) as capital letters at the top of the scripts

ma_data <- read_csv(DATA_PATH)   %>%
  filter(language == "English",
         population_type == "typically_developing", 
         stimuli_modality == "video"|stimuli_modality == "animation",
         !is.na(mean_age))
## Parsed with column specification:
## cols(
##   .default = col_character(),
##   mean_age = col_double(),
##   productive_vocab_mean = col_double(),
##   productive_vocab_median = col_double(),
##   n_train_test_pair = col_double(),
##   n_test_trial_per_pair = col_double(),
##   n_repetitions_sentence = col_double(),
##   n_repetitions_video = col_double(),
##   inclusion_certainty = col_double(),
##   n_1 = col_double(),
##   x_1 = col_double(),
##   x_2 = col_double(),
##   x_2_raw = col_double(),
##   sd_1 = col_double(),
##   sd_2 = col_double(),
##   sd_2_raw = col_double(),
##   t = col_double(),
##   d = col_double(),
##   d_calc = col_double(),
##   d_var_calc = col_double()
## )
## See spec(...) for full column specifications.
# missing vocab
ma_data %>% filter(is.na(productive_vocab_mean) & is.na(productive_vocab_median)) %>%   DT::datatable()
# transitive missing patient argument
ma_data %>% filter(is.na(patient_argument_type) & sentence_structure == "transitive") %>% DT::datatable()
# intransitive all have no patient argument, maybe needs to be changed to something else
ma_data %>% filter(!is.na(patient_argument_type) & sentence_structure == "intransitive" ) %>% DT::datatable()# error needs to be fixed
# missing n_repetition sentence, needs to be filled in
ma_data %>% filter(is.na(n_repetitions_sentence)) %>% DT::datatable()#needs to be filled in 
# missing n_repetition video, needs to be filled in
ma_data %>% filter(is.na(n_repetitions_video)) %>% DT::datatable()
# missing test question
ma_data %>% filter(is.na(test_question)) %>% DT::datatable()