Rows: 44775 Columns: 12
── Column specification ────────────────────────────────────────────────────────
Delimiter: ","
chr (8): prolific_id, trial_type, block_type, background_stimulus, deviant_s...
dbl (4): total_rt, block_number, trial_number, total_trial_number
ℹ 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.
## unique combinations of stimuli pairs in test trialsexp2_unique_stimuli_pairs <- exp2_test_only %>%group_by(bg_image, dv_image, violation_type) %>%summarise(count =n(), .groups ="drop") %>%mutate(pairID =row_number())
### number of unique combinations of deviant trials used in study:nrow(filter(exp2_unique_stimuli_pairs, violation_type !="background")) # 2674 (in theory there are 128*2+128*2+128*15+128*2=2688 unique pairs)
[1] 2674
### number of background trials used in studynrow(filter(exp2_unique_stimuli_pairs, violation_type =="background")) # 128 (in theory 128)
[1] 128
pose
exp2_pairs_pose <-process_pairs(filter(exp2_unique_stimuli_pairs, violation_type =="pose")) # withinpairID: 1: left to right, 2: right to left
number
exp2_pairs_number <-process_pairs(filter(exp2_unique_stimuli_pairs, violation_type =="number")) # withinpairID: 1: pair to single, 2: single to pair
identity
## no ignored typesexp2_pairs_identity <-process_pairs(filter(exp2_unique_stimuli_pairs, violation_type =="identity"))check_single_within_PoP(exp2_pairs_identity) # 440
## combing across identityexp2_pairs_animacy_noidentity <-process_pairs(filter(exp2_unique_stimuli_pairs, violation_type =="animacy"), ignore_violation_types =c("identity"))check_single_within_PoP(exp2_pairs_animacy_noidentity) # 0, but there are only 4 pair_of_pair_IDs.
[1] 0
## combining across pose and numberexp2_pairs_animacy_nopose_nonumber <-process_pairs(filter(exp2_unique_stimuli_pairs, violation_type =="animacy"), ignore_violation_types =c("pose", "number"))check_single_within_PoP(exp2_pairs_animacy_nopose_nonumber) # 9
[1] 9
ABBA: pose
ABBA_pose <- exp2_core %>%filter(violation_type =="pose") %>%left_join(exp2_pairs_pose, by =c("violation_type", "bg_image", "dv_image"))
# data quality checkABBA_pose[which(is.na(ABBA_pose$dishab)),]
Warning: Returning more (or less) than 1 row per `summarise()` group was deprecated in
dplyr 1.1.0.
ℹ Please use `reframe()` instead.
ℹ When switching from `summarise()` to `reframe()`, remember that `reframe()`
always returns an ungrouped data frame and adjust accordingly.
Warning: Removed 1 row containing missing values or values outside the scale range
(`geom_point()`).
Warning: Removed 1 row containing missing values or values outside the scale range
(`geom_point()`).