rm(list=ls())
source("../../analysis/final/useful.R")
## Loading required package: Matrix
## 
## Attaching package: 'dplyr'
## 
## The following objects are masked from 'package:plyr':
## 
##     arrange, count, desc, failwith, id, mutate, rename, summarise,
##     summarize
## 
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## 
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
## 
## Loading required package: quadprog
library(pander)
library(magrittr)
library(tidyr)
## 
## Attaching package: 'tidyr'
## 
## The following object is masked from 'package:magrittr':
## 
##     extract
## 
## The following object is masked from 'package:Matrix':
## 
##     expand
df_expt3 <- read.csv("soc-xsit-expt3-finalData.csv")

Experiment 3

Exposure trials

Did particpants follow the target of gaze on exposure trials in the test block (second block) after seeing different levels of reliablity during familiarization?

m1_expo_expt3 <- glmer(correct ~ reliability + (1 | subids),
                       data = filter(df_expt3, trial_category == "exposure", block == "test", experiment == "replication"),
                       control=glmerControl(optimizer="bobyqa"),
                       nAGQ = 0,
                       family = binomial)

knitr::kable(summary(m1_expo_expt3)$coef, digits=2)
Estimate Std. Error z value Pr(>|z|)
(Intercept) 2.57 0.30 8.63 0.00
reliability 1.28 0.51 2.51 0.01

Test trials

Reliablity as a continuous predictor

m1_expt3 <- glmer(correct ~ reliability * trialType + (trialType | subids),
                  nAGQ = 1,
                  control = glmerControl(optimizer = "bobyqa"),
                  data = filter(df_expt3, trial_category == "test", block == "test", experiment == "replication", 
                                include_good_rt == "include"),
                  family = binomial)

knitr::kable(summary(m1_expt3)$coef, digits=3)
Estimate Std. Error z value Pr(>|z|)
(Intercept) 3.449 0.417 8.264 0.000
reliability 0.717 0.452 1.586 0.113
trialTypeSwitch -3.984 0.420 -9.486 0.000
reliability:trialTypeSwitch -0.900 0.459 -1.961 0.050

Significant interaction with reliability condition

Gaze following as predictor

m2_expt3 <- glmer(correct ~ total_exposure_correct * trialType + (trialType | subids),
                  control = glmerControl(optimizer = "bobyqa"),
                  data = filter(df_expt3, trial_category == "test", block == "test",
                                experiment == "replication", include_good_rt == "include"),
                  nAGQ = 1,
                  family = binomial)

knitr::kable(summary(m2_expt3)$coef, digits =3)
Estimate Std. Error z value Pr(>|z|)
(Intercept) 2.090 0.531 3.936 0.000
total_exposure_correct 0.234 0.072 3.243 0.001
trialTypeSwitch -1.848 0.532 -3.473 0.001
total_exposure_correct:trialTypeSwitch -0.362 0.072 -4.994 0.000