PARTICIPANTS

11 participants, 4-7 years of age.

TEST PERFORMANCE

Children are (mostly) successful in learning the novel words, both when consistently and when inconsistently labeled, across all three labeling blocks (1 vs. 2, 1 vs. 3, 1 vs. 4).

item_info_v1b <- d_v1b %>%
  filter(trialType=="learning") %>%
  group_by(subject, round_condition, choiceImage,curTrueWord) %>%
  summarize(expNum=sum(trueWordTrial)) %>%
  rename(targetImage=choiceImage) %>%
  mutate(freq_condition=case_when(
    expNum==1 ~ "inconsistent",
    TRUE ~ "consistent"
  ))

test_v1b <- d_v1b %>%
  filter(trialType=="test")

test_v1b <- test_v1b %>%
  select(-round_condition,-curTrueWord) %>%
  left_join(item_info_v1b)

summarize_subj_test_v1b <- test_v1b %>%
  group_by(subject,round_condition,freq_condition) %>%
  summarize(n=n(),accuracy=mean(isRight))

summarize_test_v1b <- summarize_subj_test_v1b %>%
  ungroup() %>%
  group_by(round_condition,freq_condition) %>%
  summarize(acc=mean(accuracy),se=se(accuracy))

ggplot(summarize_test_v1b,aes(x=freq_condition,acc, fill=freq_condition,color=freq_condition))+
  geom_bar(stat="identity",fill=NA,size=3) +
  geom_jitter(data=summarize_subj_test_v1b,aes(y=accuracy),width=0.1,height=0)+
  geom_errorbar(aes(ymin=acc-se,ymax=acc+se), width=0.1)+
  geom_hline(yintercept=0.5,linetype="dashed")+
  theme(legend.position="none")+
  scale_y_continuous(breaks=c(0,0.25,0.5,0.75,1))+
  facet_wrap(~round_condition)

SAMPLING

Children are showing marginal evidence of preferring to select the more inconsistently labeled object, and the trend suggests that they are more likely to do so as inconsistency increases.

d_v1b <- d_v1b %>%
  mutate(choice_type=if_else(choice==option1,word_condition_1,word_condition_2)
  ) %>%
  mutate(
    word_condition_type=case_when(
      word_condition_1<word_condition_2 ~ paste(word_condition_1,"_",word_condition_2,sep=""),
      word_condition_1>=word_condition_2 ~ paste(word_condition_2,"_",word_condition_1,sep="")
    )
  ) %>%
  mutate(
    high_word_condition=case_when(
      word_condition_1<word_condition_2 ~ word_condition_2,
      word_condition_1>=word_condition_2 ~ word_condition_1
    )
  ) %>%
  mutate(
    low_word_condition=case_when(
      word_condition_1<word_condition_2 ~ word_condition_1,
      word_condition_1>=word_condition_2 ~ word_condition_2
    )
  ) %>%
  mutate(uncertain_choice=ifelse(choice_type>1,"high","low"))

#table(d_v1b$word_condition_type,d_v1b$uncertain_choice)


d_v1b$word_condition_cont <- ifelse(d_v1b$word_condition_type=="1_2",1,
                                    ifelse(d_v1b$word_condition_type=="1_3",2,
                                           ifelse(d_v1b$word_condition_type=="1_4",3,NA)))

summarize_sampling_v1b <- d_v1b %>%
  filter(trialType=="sampling") %>%
  group_by(word_condition_type,word_condition_cont) %>%
  summarize(N=n(),prop_choice_high=mean(choice_type==high_word_condition),se=se(choice_type==high_word_condition),prop_choice_low=mean(choice_type==low_word_condition))

ggplot(summarize_sampling_v1b,aes(word_condition_type,prop_choice_high,fill=word_condition_type))+
  geom_bar(stat="identity")+
  geom_errorbar(aes(ymin=prop_choice_high-se,ymax=prop_choice_high+se),width=0.05)+
  geom_hline(yintercept=0.5,linetype="dashed")+
  scale_fill_brewer()+
  theme(legend.position="none")

summarize_sampling_subject_v1b  <- d_v1b %>%
  filter(trialType=="sampling") %>%
  group_by(subject) %>%
  summarize(N=n(),prop_choice_high=mean(choice_type==high_word_condition))

summarize_sampling_subject_condition_v1b <- d_v1b %>%
  filter(trialType=="sampling") %>%
  group_by(subject,word_condition_type) %>%
  summarize(N=n(),prop_choice_high=mean(choice_type==high_word_condition)) %>%
  mutate(round_condition=case_when(
    word_condition_type == "1_2" ~ "1_vs_2",
    word_condition_type == "1_3" ~ "1_vs_3",
    word_condition_type == "1_4" ~ "1_vs_4"
  ))

TEST AND SAMPLING

summarize_subj_test_v1b <- summarize_subj_test_v1b %>%
  left_join(summarize_sampling_subject_condition_v1b)

summarize_test_sampling_v1b <- summarize_subj_test_v1b %>%
  group_by(round_condition,prop_choice_high, freq_condition) %>%
  summarize(acc=mean(accuracy),se=se(accuracy)) %>%
  mutate(inconsistent_chosen=ifelse(prop_choice_high==1,"inconsistent","consistent"))

ggplot(summarize_test_sampling_v1b,aes(inconsistent_chosen,acc,fill=inconsistent_chosen))+
  geom_bar(stat="identity")+
  geom_errorbar(aes(ymin=acc-se,ymax=acc+se),width=0.05)+
  geom_hline(yintercept=0.5,linetype="dashed")+
  #scale_fill_brewer()+
  theme(legend.position="none")+
  facet_wrap(~round_condition+freq_condition,ncol=2)