Children and adults viewed and described scenes depicting an agent and a patient engaging in an event that could be interpreted in two ways (e.g., chasing/fleeing). The scenes on each trial contained one animate character (a human) and one inanimate character (an anthropomorphic shape, altho perhaps we should not describe such a character as inanimate). On half the trials the human was the Agent, and on half the trials the shape was the Agent. On half of the trials the human was made less salient by being shown in grayscale. On half of the trials the shape was made less salient by being shown in grayscale.
We tracked participants’ gaze as they viewed and described the scenes. We tested whether they were more likely to make the animate character the subject of their sentence, and whether they were less likely to make the less salient character the subejct. We also tested where they gazed when the scene was first shown, whether their initial gaze predicted their utterance, and whether their utterance was produced incrementally (i.e., not looking to the second-mentioned picture before starting their description).
fixpropbinl_adult <- stim_onset_data(newdata_adult,adult_responses)
ANIfixpropbinl<-summaryBy(value~time+variable+ AnimacyofAgent +MentionAgent,data=fixpropbinl_adult,keep.names = T, FUN = c(mean,ci.low,ci.high))
SALfixpropbinl<-summaryBy(value~time+variable+ SaliencyofAgent + MentionAgent,data=fixpropbinl_adult,keep.names = T, FUN = c(mean,ci.low,ci.high))
stim_animacy_adult <- ggplot(ANIfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ AnimacyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \nof whether Agent was Animate\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")
stim_salience_adult <- ggplot(SALfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ SaliencyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \n of whether Agent was Salient\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")fixpropbinl_child <- stim_onset_data(newdata_child,child_responses)
fixpropbinl_child <- fixpropbinl_child %>% filter(!is.na(fixpropbinl_child$MentionAgent))
ANIfixpropbinl<-summaryBy(value~time+variable+ AnimacyofAgent +MentionAgent,data=fixpropbinl_child,keep.names = T, FUN = c(mean,ci.low,ci.high))
SALfixpropbinl<-summaryBy(value~time+variable+ SaliencyofAgent + MentionAgent,data=fixpropbinl_child,keep.names = T, FUN = c(mean,ci.low,ci.high))
stim_animacy_child <- ggplot(ANIfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ AnimacyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \n of whether Agent was Animate\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")
stim_salience_child <- ggplot(SALfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ SaliencyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \n of whether Agent was Salient\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")stim_animacy_adultstim_animacy_childstim_salience_adultstim_salience_childuttfixpropbinl_adult <- utt_onset_data(uttdata_adult, adult_responses)
##Speech onset
ANIuttfixpropbinl<-summaryBy(value~time+variable+ AnimacyofAgent + MentionAgent,data=uttfixpropbinl_adult,keep.names = T, FUN = c(mean,ci.low,ci.high))
SALuttfixpropbinl<-summaryBy(value~time+variable+ SaliencyofAgent + MentionAgent,data=uttfixpropbinl_adult,keep.names = T, FUN = c(mean,ci.low,ci.high))
speech_animacy_adult <- ggplot(ANIuttfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ AnimacyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \nof whether Agent was Animate\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")
speech_salience_adult <- ggplot(SALuttfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ SaliencyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \n of whether Agent was Salient\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")uttfixpropbinl_child <- utt_onset_data(uttdata_child, child_responses)
uttfixpropbinl_child <- uttfixpropbinl_child %>% filter(!is.na(uttfixpropbinl_child$MentionAgent))
##Speech onset
ANIuttfixpropbinl<-summaryBy(value~time+variable+ AnimacyofAgent + MentionAgent,data=uttfixpropbinl_child,keep.names = T, FUN = c(mean,ci.low,ci.high))
SALuttfixpropbinl<-summaryBy(value~time+variable+ SaliencyofAgent + MentionAgent,data=uttfixpropbinl_child,keep.names = T, FUN = c(mean,ci.low,ci.high))
pd <- position_dodge(0.1) # move them .05 to the left and right
speech_animacy_child <- ggplot(ANIuttfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ AnimacyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \nof whether Agent was Animate\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")
speech_salience_child <- ggplot(SALuttfixpropbinl, aes(y = value.mean, x = time, color = variable))+
geom_line() +
geom_point() +
geom_errorbar(aes(ymin=value.mean-value.ci.low, ymax=value.mean+value.ci.high), colour="gray", width=.1, position=pd) +
theme_cowplot() +
facet_wrap(~ SaliencyofAgent + MentionAgent) +
ggtitle("Gaze to Agent and Patient as a function \n of whether Agent was Salient\n and whether Agent or Patient were used as Subject")+
ylab("Proportion Gaze to Character")+
labs(color="Character gazed at")speech_animacy_adultspeech_animacy_childspeech_salience_adultspeech_salience_child