L2 eeg amplitude, accurate items only

baseline= -470 to -270

set working directory and load in data The eeg data file includes both L1 and L2 together, so need to restrict data to just L1

setwd("C:/Users/Katie/Desktop/Research/Dissertation/STUDIES/Studies 3 and 4 EEG/L1 and L2 French/EEG Inaccurate removed/EEG data/")
list.files()
##  [1] "kate-output-470baseline-ALL-every-ms.txt"
##  [2] "kate-output-470baseline-ALL.txt"         
##  [3] "L1 and L2 acc-only eeg amplitude.Rmd"    
##  [4] "L1___L2_acc-only_eeg_amplitude.Rmd"      
##  [5] "L1_and_L2_acc-only_eeg_amplitude.html"   
##  [6] "L2 acc-only eeg amplitude.Rmd"           
##  [7] "L2 offline data for R.csv"               
##  [8] "L2_acc-only_eeg_amplitude.html"          
##  [9] "L2_acc-only_eeg_amplitude.Rmd"           
## [10] "rsconnect"
data<-read.table("kate-output-470baseline-ALL.txt",header=TRUE)

all.subs<-unique(data$subj)
L1.subj<-as.character(all.subs[32:61])
L2.subj<-as.character(all.subs[1:31])
lang.l1<-rep("L1",30)
L1<-cbind(L1.subj,lang.l1)
lang.l2<-rep("L2",31)
L2<-cbind(L2.subj,lang.l2)
colnames(L1)<-c("subj","lang")
colnames(L2)<-c("subj","lang")
subj.lang<-rbind(L1,L2)

library(qdap)
data$lang<-lookup(data$subj,subj.lang)

data<-data[data$lang=="L2",]

Add condition and relatedness to the dataframe

cond<-as.character(unique(data[,2]))
conditions<-c("id","id","morph","morph", "orth", "orth", "sem","sem")
match_cond<-cbind(cond,conditions)
relateds<-c("rel","unrel","rel","unrel", "rel", "unrel", "rel","unrel")
match_rel<-cbind(cond,relateds)

data$Condition<-lookup(data$cond,match_cond)
data$Related<-lookup(data$cond,match_rel)
data$Condition<-as.factor(as.character(data$Condition))
data$Related<-as.factor(as.character(data$Related))
data$lang<-as.factor(as.character(data$lang))

head(data,15)
##     subj cond chan        win     mean lang Condition Related
## 1  KC101 fidr  Fp1 +100..+301  3.40080   L2        id     rel
## 2  KC101 fidr  Fp1 +301..+500 -5.22830   L2        id     rel
## 3  KC101 fidr  Fp1 +500..+600 -7.72310   L2        id     rel
## 4  KC101 fidr  Fp1 +176..+275  2.36930   L2        id     rel
## 5  KC101 fidr  Fp1 +350..+449 -6.82230   L2        id     rel
## 6  KC101 fidr  Fp1 +449..+551 -6.84700   L2        id     rel
## 7  KC101 fidr  Fp2 +100..+301  7.03560   L2        id     rel
## 8  KC101 fidr  Fp2 +301..+500 -0.50613   L2        id     rel
## 9  KC101 fidr  Fp2 +500..+600 -1.84000   L2        id     rel
## 10 KC101 fidr  Fp2 +176..+275  6.40640   L2        id     rel
## 11 KC101 fidr  Fp2 +350..+449 -1.92650   L2        id     rel
## 12 KC101 fidr  Fp2 +449..+551 -1.96650   L2        id     rel
## 13 KC101 fidr   F3 +100..+301  5.96740   L2        id     rel
## 14 KC101 fidr   F3 +301..+500 -1.37510   L2        id     rel
## 15 KC101 fidr   F3 +500..+600 -0.25718   L2        id     rel

Add factors of hemisphere (3 levels) and AntPos (3 levels) for 20 electrodes

electrodes<-as.character(unique(data$chan))
hems<-c("left","right","left","right","left","right","left","right","left","right","left","right","left","right","left","right","mid","mid","mid","mid") 
el.hem<-cbind(electrodes,hems)
antpos<-c("ant","ant","ant","ant","central","central","post","post","ant","ant","central","central","post","post","post","post","ant","central","post","post")
el.antpost<-cbind(electrodes,antpos)

data$hemisphere<-lookup(data$chan,el.hem)
data$hemisphere<-as.factor(data$hemisphere)
data$antpos<-lookup(data$chan,el.antpost)
data$antpos<-as.factor(data$antpos)

Relevel to make the unrelated condition the baseline and make central the baseline for antpos and mid for hemisphere

data$Related<-relevel(data$Related,ref="unrel")
data$antpos<-relevel(data$antpos,ref="central")
data$hemisphere<-relevel(data$hemisphere,ref="mid")

Code hemisphere and antpos with sum coding instead of deviance coding

#contrasts(data$hemisphere)<-contr.sum(3,contrasts=FALSE)
#contrasts(data$antpos)<-contr.sum(3, contrasts=FALSE)

Remove participants

data<-data[data$subj!="KC107" &data$subj!="KC109" &data$subj!="KC110" &data$subj!="KC116" &data$subj!="KC125",]
background<-read.csv("L2 offline data for R.csv", header=TRUE)
background
##    Subject LexTale  AoA YrsInstr YrsMontreal PercentFrench  Accuracy
## 1    KC101 0.64375 11.0      7.0        3.00            10 0.8024911
## 2    KC102 0.55625 17.0      3.0        3.00            10 0.7569444
## 3    KC103 0.48750 16.0      1.0        5.00            10 0.5541958
## 4    KC104 0.67500 12.0     10.0        0.33            10 0.8854167
## 5    KC105 0.62500 13.0      5.0        5.00             1 0.7940663
## 6    KC106 0.56250 15.0      4.0        0.25            15 0.7282230
## 7    KC107 0.73750 10.0      6.0        5.00            10 0.9160839
## 8    KC108 0.62500 12.0      5.0        6.00            20 0.7385740
## 9    KC109 0.56250 10.0      9.0        3.00             0 0.7534965
## 10   KC110 0.87500 12.0     12.0        6.00            70 0.8734622
## 11   KC111 0.56875 10.0      5.0        0.25             5 0.7170139
## 12   KC112 0.50000 27.0      2.0       10.00            10        NA
## 13   KC113 0.73750 13.0     11.0        2.00            30 0.8802817
## 14   KC114 0.56875 11.0      8.0        1.00            10 0.8246528
## 15   KC115 0.57500 12.0      3.0        3.00             5 0.5034722
## 16   KC116 0.63125 10.0      7.0        0.25            30 0.8375734
## 17   KC117 0.68750 12.0      8.0        7.00            20 0.8758993
## 18   KC118 0.56875 18.0      2.0        3.00            15 0.7432188
## 19   KC119 0.56875 18.0      1.5        1.25             5 0.7290210
## 20   KC120 0.70000 13.0      6.0        1.25            30 0.9079861
## 21   KC121 0.54375 19.0      3.0        0.85             5 0.7552448
## 22   KC122 0.76875 13.0      7.0        7.00            30 0.7552448
## 23   KC123 0.80000 15.5      5.0        2.00            15 0.9106029
## 24   KC124 0.57500 11.0      7.0        2.00             1 0.8524306
## 25   KC125 0.54375 20.0      1.5        5.00             1 0.6805556
## 26   KC126 0.52500 10.0      4.0        0.25             2 0.6481836
## 27   KC127 0.61250 14.0      4.0        3.00             5 0.8246528
## 28   KC128 0.53750 26.0      1.0       10.00             2 0.7477954
## 29   KC129 0.75000 13.0      2.0        7.00            30 0.8987069
## 30   KC130 0.63750 10.0      9.0        3.00            10 0.8512545
## 31   KC131 0.49375 10.0      4.0        0.25             1 0.6024518
## 32   KC132 0.73125 10.0     14.0        3.50            30 0.9055944

Add background info to data dataframe

library(dplyr)
library(MASS)
data<-rename(data,Subject=subj)

lextale<-background[,c(1,2)]
aoa<-background[,c(1,3)]
yrsinstr<-background[,c(1,4)]
yrsmontreal<-background[,c(1,5)]
percentfrench<-background[,c(1,6)]

data$lextale<-lookup(data$Subject,lextale)
data$aoa<-lookup(data$Subject,aoa)
data$yrsinstr<-lookup(data$Subject,yrsinstr)
data$yrsmontreal<-lookup(data$Subject,yrsmontreal)
data$percentfrench<-lookup(data$Subject,percentfrench)

head(data)
##   Subject cond chan        win    mean lang Condition Related hemisphere
## 1   KC101 fidr  Fp1 +100..+301  3.4008   L2        id     rel       left
## 2   KC101 fidr  Fp1 +301..+500 -5.2283   L2        id     rel       left
## 3   KC101 fidr  Fp1 +500..+600 -7.7231   L2        id     rel       left
## 4   KC101 fidr  Fp1 +176..+275  2.3693   L2        id     rel       left
## 5   KC101 fidr  Fp1 +350..+449 -6.8223   L2        id     rel       left
## 6   KC101 fidr  Fp1 +449..+551 -6.8470   L2        id     rel       left
##   antpos lextale aoa yrsinstr yrsmontreal percentfrench
## 1    ant 0.64375  11        7           3            10
## 2    ant 0.64375  11        7           3            10
## 3    ant 0.64375  11        7           3            10
## 4    ant 0.64375  11        7           3            10
## 5    ant 0.64375  11        7           3            10
## 6    ant 0.64375  11        7           3            10

Center lextale score for normal distribution

data$center_lextale<-scale(data$lextale, center = TRUE, scale = FALSE)
data$center_lextale<-as.numeric(data$center_lextale)

create time windows

time100<-data[data$win=="+100..+301",]
time300<-data[data$win=="+301..+500",]
time500<-data[data$win=="+500..+600",]

time175<-data[data$win=="+176..+275",]
time350<-data[data$win=="+350..+449",]
time450<-data[data$win=="+449..+551",]

omnibus, time-window 100-300

library(lme4)
library(lmerTest)

t1.1<-lmer(mean~Condition*Related*center_lextale*hemisphere*antpos+(1+Related|Subject),time100)


#step(t1.1)


t1.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + antpos + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale + Related:center_lextale + center_lextale:antpos + 
    hemisphere:antpos + Condition:Related:center_lextale, data = time100)

summary(t1.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: 
## mean ~ Condition + Related + center_lextale + hemisphere + antpos +  
##     (1 + Related | Subject) + Condition:Related + Condition:center_lextale +  
##     Related:center_lextale + center_lextale:antpos + hemisphere:antpos +  
##     Condition:Related:center_lextale
##    Data: time100
## 
## REML criterion at convergence: 19591.6
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.0250 -0.5513  0.0452  0.5951  6.8421 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 2.991    1.729         
##           Relatedrel  1.181    1.087    -0.49
##  Residual             6.287    2.507         
## Number of obs: 4160, groups:  Subject, 26
## 
## Fixed effects:
##                                           Estimate Std. Error        df
## (Intercept)                                 2.1015     0.3948   42.0000
## Conditionmorph                              0.4073     0.1555 4086.0000
## Conditionorth                              -0.1640     0.1555 4086.0000
## Conditionsem                               -0.1680     0.1555 4086.0000
## Relatedrel                                  1.1630     0.2638   44.0000
## center_lextale                              2.8565     4.2486   30.0000
## hemisphereleft                             -0.5611     0.2129 4086.0000
## hemisphereright                            -0.5145     0.2129 4086.0000
## antposant                                   1.3237     0.2459 4086.0000
## antpospost                                 -2.2628     0.2129 4086.0000
## Conditionmorph:Relatedrel                  -1.3635     0.2199 4086.0000
## Conditionorth:Relatedrel                   -0.9346     0.2199 4086.0000
## Conditionsem:Relatedrel                    -1.2778     0.2199 4086.0000
## Conditionmorph:center_lextale              -4.6510     1.8208 4086.0000
## Conditionorth:center_lextale               -2.0788     1.8208 4086.0000
## Conditionsem:center_lextale                 0.8153     1.8208 4086.0000
## Relatedrel:center_lextale                   0.8215     3.0894   44.0000
## center_lextale:antposant                    2.9318     1.1920 4086.0000
## center_lextale:antpospost                  -0.5568     1.1605 4086.0000
## hemisphereleft:antposant                    0.4146     0.2926 4086.0000
## hemisphereright:antposant                   0.7153     0.2926 4086.0000
## hemisphereleft:antpospost                  -1.1937     0.2656 4086.0000
## hemisphereright:antpospost                 -0.8521     0.2656 4086.0000
## Conditionmorph:Relatedrel:center_lextale   -1.5588     2.5750 4086.0000
## Conditionorth:Relatedrel:center_lextale    -1.6736     2.5750 4086.0000
## Conditionsem:Relatedrel:center_lextale     -6.9699     2.5750 4086.0000
##                                          t value Pr(>|t|)    
## (Intercept)                                5.323 3.75e-06 ***
## Conditionmorph                             2.620  0.00884 ** 
## Conditionorth                             -1.054  0.29178    
## Conditionsem                              -1.080  0.28003    
## Relatedrel                                 4.408 6.65e-05 ***
## center_lextale                             0.672  0.50654    
## hemisphereleft                            -2.635  0.00845 ** 
## hemisphereright                           -2.417  0.01571 *  
## antposant                                  5.384 7.70e-08 ***
## antpospost                               -10.627  < 2e-16 ***
## Conditionmorph:Relatedrel                 -6.200 6.19e-10 ***
## Conditionorth:Relatedrel                  -4.250 2.19e-05 ***
## Conditionsem:Relatedrel                   -5.810 6.71e-09 ***
## Conditionmorph:center_lextale             -2.554  0.01067 *  
## Conditionorth:center_lextale              -1.142  0.25365    
## Conditionsem:center_lextale                0.448  0.65436    
## Relatedrel:center_lextale                  0.266  0.79154    
## center_lextale:antposant                   2.460  0.01395 *  
## center_lextale:antpospost                 -0.480  0.63141    
## hemisphereleft:antposant                   1.417  0.15661    
## hemisphereright:antposant                  2.444  0.01456 *  
## hemisphereleft:antpospost                 -4.495 7.15e-06 ***
## hemisphereright:antpospost                -3.209  0.00134 ** 
## Conditionmorph:Relatedrel:center_lextale  -0.605  0.54497    
## Conditionorth:Relatedrel:center_lextale   -0.650  0.51576    
## Conditionsem:Relatedrel:center_lextale    -2.707  0.00682 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
lmerTest::anova(t1.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                                   Sum Sq Mean Sq NumDF DenDF F.value
## Condition                          407.3   135.8     3  4086   21.59
## Related                              8.8     8.8     1    24    1.41
## center_lextale                       0.8     0.8     1    24    0.13
## hemisphere                         343.9   172.0     2  4086   27.35
## antpos                           14997.8  7498.9     2  4086 1192.79
## Condition:Related                  303.8   101.3     3  4086   16.11
## Condition:center_lextale           112.1    37.4     3  4086    5.94
## Related:center_lextale               2.7     2.7     1    24    0.42
## center_lextale:antpos               75.5    37.7     2  4086    6.00
## hemisphere:antpos                  327.0    81.8     4  4086   13.01
## Condition:Related:center_lextale    52.7    17.6     3  4086    2.79
##                                     Pr(>F)    
## Condition                        7.139e-14 ***
## Related                          0.2473507    
## center_lextale                   0.7171634    
## hemisphere                       1.584e-12 ***
## antpos                           < 2.2e-16 ***
## Condition:Related                2.077e-10 ***
## Condition:center_lextale         0.0004844 ***
## Related:center_lextale           0.5213311    
## center_lextale:antpos            0.0024976 ** 
## hemisphere:antpos                1.590e-10 ***
## Condition:Related:center_lextale 0.0388736 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

100-300 omnibus lmer-output of interest

Resolve interations by splitting by antpos first

ant100<-time100[time100$antpos=="ant",]
cent100<-time100[time100$antpos=="central",]
post100<-time100[time100$antpos=="post",]

100-300, anterior

ant1.1<-lmer(mean~Condition*Related*center_lextale*hemisphere+(1+Related|Subject),ant100)

#step(ant1.1)

ant1.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale + Related:center_lextale + Condition:Related:center_lextale, 
    data = ant100)


summary(ant1.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition + Related + center_lextale + hemisphere + (1 +  
##     Related | Subject) + Condition:Related + Condition:center_lextale +  
##     Related:center_lextale + Condition:Related:center_lextale
##    Data: ant100
## 
## REML criterion at convergence: 6519.1
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.4253 -0.5451  0.0110  0.5882  5.5756 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 6.487    2.547         
##           Relatedrel  2.424    1.557    -0.62
##  Residual             4.746    2.179         
## Number of obs: 1456, groups:  Subject, 26
## 
## Fixed effects:
##                                            Estimate Std. Error         df
## (Intercept)                                 3.33245    0.54328   31.90000
## Conditionmorph                              0.83101    0.22838 1390.00000
## Conditionorth                               0.04371    0.22838 1390.00000
## Conditionsem                               -0.27021    0.22838 1390.00000
## Relatedrel                                  1.48302    0.38130   44.80000
## center_lextale                              2.91104    6.14698   27.80000
## hemisphereleft                             -0.14645    0.17443 1390.00000
## hemisphereright                             0.20075    0.17443 1390.00000
## Conditionmorph:Relatedrel                  -2.22293    0.32298 1390.00000
## Conditionorth:Relatedrel                   -1.39731    0.32298 1390.00000
## Conditionsem:Relatedrel                    -1.55218    0.32298 1390.00000
## Conditionmorph:center_lextale              -2.59813    2.67417 1390.00000
## Conditionorth:center_lextale                0.33160    2.67417 1390.00000
## Conditionsem:center_lextale                 8.92930    2.67417 1390.00000
## Relatedrel:center_lextale                   4.58439    4.46473   44.80000
## Conditionmorph:Relatedrel:center_lextale   -4.58534    3.78185 1390.00000
## Conditionorth:Relatedrel:center_lextale    -4.59433    3.78185 1390.00000
## Conditionsem:Relatedrel:center_lextale    -18.21036    3.78185 1390.00000
##                                          t value Pr(>|t|)    
## (Intercept)                                6.134 7.48e-07 ***
## Conditionmorph                             3.639 0.000284 ***
## Conditionorth                              0.191 0.848256    
## Conditionsem                              -1.183 0.236947    
## Relatedrel                                 3.889 0.000330 ***
## center_lextale                             0.474 0.639503    
## hemisphereleft                            -0.840 0.401285    
## hemisphereright                            1.151 0.249979    
## Conditionmorph:Relatedrel                 -6.883 8.87e-12 ***
## Conditionorth:Relatedrel                  -4.326 1.62e-05 ***
## Conditionsem:Relatedrel                   -4.806 1.71e-06 ***
## Conditionmorph:center_lextale             -0.972 0.331436    
## Conditionorth:center_lextale               0.124 0.901332    
## Conditionsem:center_lextale                3.339 0.000863 ***
## Relatedrel:center_lextale                  1.027 0.310025    
## Conditionmorph:Relatedrel:center_lextale  -1.212 0.225543    
## Conditionorth:Relatedrel:center_lextale   -1.215 0.224635    
## Conditionsem:Relatedrel:center_lextale    -4.815 1.63e-06 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) Cndtnm Cndtnr Cndtns Rltdrl cntr_l hmsphrl hmsphrr
## Conditnmrph -0.210                                                   
## Conditinrth -0.210  0.500                                            
## Conditionsm -0.210  0.500  0.500                                     
## Relatedrel  -0.580  0.299  0.299  0.299                              
## center_lxtl  0.000  0.000  0.000  0.000  0.000                       
## hemisphrlft -0.241  0.000  0.000  0.000  0.000  0.000                
## hemsphrrght -0.241  0.000  0.000  0.000  0.000  0.000  0.750         
## Cndtnmrph:R  0.149 -0.707 -0.354 -0.354 -0.424  0.000  0.000   0.000 
## Cndtnrth:Rl  0.149 -0.354 -0.707 -0.354 -0.424  0.000  0.000   0.000 
## Cndtnsm:Rlt  0.149 -0.354 -0.354 -0.707 -0.424  0.000  0.000   0.000 
## Cndtnmrph:_  0.000  0.000  0.000  0.000  0.000 -0.218  0.000   0.000 
## Cndtnrth:c_  0.000  0.000  0.000  0.000  0.000 -0.218  0.000   0.000 
## Cndtnsm:cn_  0.000  0.000  0.000  0.000  0.000 -0.218  0.000   0.000 
## Rltdrl:cnt_  0.000  0.000  0.000  0.000  0.000 -0.600  0.000   0.000 
## Cndtnmr:R:_  0.000  0.000  0.000  0.000  0.000  0.154  0.000   0.000 
## Cndtnrt:R:_  0.000  0.000  0.000  0.000  0.000  0.154  0.000   0.000 
## Cndtnsm:R:_  0.000  0.000  0.000  0.000  0.000  0.154  0.000   0.000 
##             Cndtnm:R Cndtnr:R Cndtns:R Cndtnm:_ Cndtnr:_ Cndtns:_ Rltd:_
## Conditnmrph                                                             
## Conditinrth                                                             
## Conditionsm                                                             
## Relatedrel                                                              
## center_lxtl                                                             
## hemisphrlft                                                             
## hemsphrrght                                                             
## Cndtnmrph:R                                                             
## Cndtnrth:Rl  0.500                                                      
## Cndtnsm:Rlt  0.500    0.500                                             
## Cndtnmrph:_  0.000    0.000    0.000                                    
## Cndtnrth:c_  0.000    0.000    0.000    0.500                           
## Cndtnsm:cn_  0.000    0.000    0.000    0.500    0.500                  
## Rltdrl:cnt_  0.000    0.000    0.000    0.299    0.299    0.299         
## Cndtnmr:R:_  0.000    0.000    0.000   -0.707   -0.354   -0.354   -0.424
## Cndtnrt:R:_  0.000    0.000    0.000   -0.354   -0.707   -0.354   -0.424
## Cndtnsm:R:_  0.000    0.000    0.000   -0.354   -0.354   -0.707   -0.424
##             Cndtnm:R:_ Cndtnr:R:_
## Conditnmrph                      
## Conditinrth                      
## Conditionsm                      
## Relatedrel                       
## center_lxtl                      
## hemisphrlft                      
## hemsphrrght                      
## Cndtnmrph:R                      
## Cndtnrth:Rl                      
## Cndtnsm:Rlt                      
## Cndtnmrph:_                      
## Cndtnrth:c_                      
## Cndtnsm:cn_                      
## Rltdrl:cnt_                      
## Cndtnmr:R:_                      
## Cndtnrt:R:_  0.500               
## Cndtnsm:R:_  0.500      0.500
lmerTest::anova(ant1.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                                   Sum Sq Mean Sq NumDF DenDF F.value
## Condition                        225.887  75.296     3  1390 15.8638
## Related                            1.611   1.611     1    24  0.3394
## center_lextale                     2.258   2.258     1    24  0.4757
## hemisphere                        37.741  18.871     2  1390  3.9758
## Condition:Related                237.936  79.312     3  1390 16.7100
## Condition:center_lextale          41.021  13.674     3  1390  2.8809
## Related:center_lextale             1.668   1.668     1    24  0.3515
## Condition:Related:center_lextale 123.582  41.194     3  1390  8.6791
##                                     Pr(>F)    
## Condition                        3.812e-10 ***
## Related                            0.56560    
## center_lextale                     0.49697    
## hemisphere                         0.01898 *  
## Condition:Related                1.146e-10 ***
## Condition:center_lextale           0.03481 *  
## Related:center_lextale             0.55880    
## Condition:Related:center_lextale 1.047e-05 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

100 - 300, anterior

100-300, central

cent1.1<-lmer(mean~Condition*Related*center_lextale*hemisphere+(1+Related|Subject),cent100)

#step(cent1.1)

cent1.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale, data = cent100)

summary(cent1.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition + Related + center_lextale + hemisphere + (1 +  
##     Related | Subject) + Condition:Related + Condition:center_lextale
##    Data: cent100
## 
## REML criterion at convergence: 4079.4
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -4.4836 -0.5924  0.0002  0.6150  3.5638 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 3.519    1.876         
##           Relatedrel  1.707    1.306    -0.55
##  Residual             2.591    1.610         
## Number of obs: 1040, groups:  Subject, 26
## 
## Fixed effects:
##                               Estimate Std. Error       df t value
## (Intercept)                     2.2539     0.4065  33.7000   5.545
## Conditionmorph                  0.3272     0.1997 977.0000   1.639
## Conditionorth                  -0.3274     0.1997 977.0000  -1.640
## Conditionsem                   -0.2691     0.1997 977.0000  -1.348
## Relatedrel                      0.9513     0.3248  48.5000   2.929
## center_lextale                  2.3581     3.8037  27.8000   0.620
## hemisphereleft                 -0.5611     0.1367 977.0000  -4.104
## hemisphereright                -0.5145     0.1367 977.0000  -3.764
## Conditionmorph:Relatedrel      -1.2374     0.2824 977.0000  -4.382
## Conditionorth:Relatedrel       -0.7414     0.2824 977.0000  -2.626
## Conditionsem:Relatedrel        -1.2798     0.2824 977.0000  -4.532
## Conditionmorph:center_lextale  -5.3348     1.6532 977.0000  -3.227
## Conditionorth:center_lextale   -1.5542     1.6532 977.0000  -0.940
## Conditionsem:center_lextale    -2.7473     1.6532 977.0000  -1.662
##                               Pr(>|t|)    
## (Intercept)                   3.47e-06 ***
## Conditionmorph                0.101570    
## Conditionorth                 0.101425    
## Conditionsem                  0.178034    
## Relatedrel                    0.005174 ** 
## center_lextale                0.540337    
## hemisphereleft                4.40e-05 ***
## hemisphereright               0.000177 ***
## Conditionmorph:Relatedrel     1.30e-05 ***
## Conditionorth:Relatedrel      0.008781 ** 
## Conditionsem:Relatedrel       6.56e-06 ***
## Conditionmorph:center_lextale 0.001293 ** 
## Conditionorth:center_lextale  0.347381    
## Conditionsem:center_lextale   0.096870 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) Cndtnm Cndtnr Cndtns Rltdrl cntr_l hmsphrl hmsphrr
## Conditnmrph -0.246                                                   
## Conditinrth -0.246  0.500                                            
## Conditionsm -0.246  0.500  0.500                                     
## Relatedrel  -0.541  0.307  0.307  0.307                              
## center_lxtl  0.000  0.000  0.000  0.000  0.000                       
## hemisphrlft -0.224  0.000  0.000  0.000  0.000  0.000                
## hemsphrrght -0.224  0.000  0.000  0.000  0.000  0.000  0.667         
## Cndtnmrph:R  0.174 -0.707 -0.354 -0.354 -0.435  0.000  0.000   0.000 
## Cndtnrth:Rl  0.174 -0.354 -0.707 -0.354 -0.435  0.000  0.000   0.000 
## Cndtnsm:Rlt  0.174 -0.354 -0.354 -0.707 -0.435  0.000  0.000   0.000 
## Cndtnmrph:_  0.000  0.000  0.000  0.000  0.000 -0.217  0.000   0.000 
## Cndtnrth:c_  0.000  0.000  0.000  0.000  0.000 -0.217  0.000   0.000 
## Cndtnsm:cn_  0.000  0.000  0.000  0.000  0.000 -0.217  0.000   0.000 
##             Cndtnm:R Cndtnr:R Cndtns:R Cndtnm:_ Cndtnr:_
## Conditnmrph                                             
## Conditinrth                                             
## Conditionsm                                             
## Relatedrel                                              
## center_lxtl                                             
## hemisphrlft                                             
## hemsphrrght                                             
## Cndtnmrph:R                                             
## Cndtnrth:Rl  0.500                                      
## Cndtnsm:Rlt  0.500    0.500                             
## Cndtnmrph:_  0.000    0.000    0.000                    
## Cndtnrth:c_  0.000    0.000    0.000    0.500           
## Cndtnsm:cn_  0.000    0.000    0.000    0.500    0.500
lmerTest::anova(cent1.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                           Sum Sq Mean Sq NumDF DenDF F.value    Pr(>F)    
## Condition                129.338  43.113     3   977 16.6365 1.510e-10 ***
## Related                    0.639   0.639     1    25  0.2468   0.62371    
## center_lextale             0.001   0.001     1    24  0.0002   0.98902    
## hemisphere                48.579  24.289     2   977  9.3730 9.288e-05 ***
## Condition:Related         69.168  23.056     3   977  8.8970 8.071e-06 ***
## Condition:center_lextale  28.841   9.614     3   977  3.7098   0.01134 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

central 100-300

100-300, posterior

post1.1<-lmer(mean~Condition*Related*center_lextale*hemisphere+(1+Related|Subject),post100)


#step(post1.1)

post1.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale, data = post100)
        
summary(post1.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition + Related + center_lextale + hemisphere + (1 +  
##     Related | Subject) + Condition:Related + Condition:center_lextale
##    Data: post100
## 
## REML criterion at convergence: 7758.6
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -3.6324 -0.6555 -0.0027  0.6599  5.5098 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 4.3406   2.0834        
##           Relatedrel  0.6571   0.8106   -0.08
##  Residual             5.7922   2.4067        
## Number of obs: 1664, groups:  Subject, 26
## 
## Fixed effects:
##                                 Estimate Std. Error         df t value
## (Intercept)                     -0.17538    0.45303   33.50000  -0.387
## Conditionmorph                   0.08671    0.23600 1601.00000   0.367
## Conditionorth                   -0.24352    0.23600 1601.00000  -1.032
## Conditionsem                    -0.01537    0.23600 1601.00000  -0.065
## Relatedrel                       1.01524    0.28455  104.80000   3.568
## center_lextale                   3.96815    4.97446   27.00000   0.798
## hemisphereleft                  -1.75475    0.15233 1601.00000 -11.519
## hemisphereright                 -1.36663    0.15233 1601.00000  -8.971
## Conditionmorph:Relatedrel       -0.69033    0.33375 1601.00000  -2.068
## Conditionorth:Relatedrel        -0.65035    0.33375 1601.00000  -1.949
## Conditionsem:Relatedrel         -1.03634    0.33375 1601.00000  -3.105
## Conditionmorph:center_lextale   -5.96222    1.95397 1601.00000  -3.051
## Conditionorth:center_lextale    -4.59776    1.95397 1601.00000  -2.353
## Conditionsem:center_lextale     -4.80329    1.95397 1601.00000  -2.458
##                               Pr(>|t|)    
## (Intercept)                   0.701106    
## Conditionmorph                0.713353    
## Conditionorth                 0.302273    
## Conditionsem                  0.948082    
## Relatedrel                    0.000544 ***
## center_lextale                0.431992    
## hemisphereleft                 < 2e-16 ***
## hemisphereright                < 2e-16 ***
## Conditionmorph:Relatedrel     0.038761 *  
## Conditionorth:Relatedrel      0.051515 .  
## Conditionsem:Relatedrel       0.001935 ** 
## Conditionmorph:center_lextale 0.002316 ** 
## Conditionorth:center_lextale  0.018741 *  
## Conditionsem:center_lextale   0.014068 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) Cndtnm Cndtnr Cndtns Rltdrl cntr_l hmsphrl hmsphrr
## Conditnmrph -0.260                                                   
## Conditinrth -0.260  0.500                                            
## Conditionsm -0.260  0.500  0.500                                     
## Relatedrel  -0.258  0.415  0.415  0.415                              
## center_lxtl  0.000  0.000  0.000  0.000  0.000                       
## hemisphrlft -0.202  0.000  0.000  0.000  0.000  0.000                
## hemsphrrght -0.202  0.000  0.000  0.000  0.000  0.000  0.600         
## Cndtnmrph:R  0.184 -0.707 -0.354 -0.354 -0.586  0.000  0.000   0.000 
## Cndtnrth:Rl  0.184 -0.354 -0.707 -0.354 -0.586  0.000  0.000   0.000 
## Cndtnsm:Rlt  0.184 -0.354 -0.354 -0.707 -0.586  0.000  0.000   0.000 
## Cndtnmrph:_  0.000  0.000  0.000  0.000  0.000 -0.196  0.000   0.000 
## Cndtnrth:c_  0.000  0.000  0.000  0.000  0.000 -0.196  0.000   0.000 
## Cndtnsm:cn_  0.000  0.000  0.000  0.000  0.000 -0.196  0.000   0.000 
##             Cndtnm:R Cndtnr:R Cndtns:R Cndtnm:_ Cndtnr:_
## Conditnmrph                                             
## Conditinrth                                             
## Conditionsm                                             
## Relatedrel                                              
## center_lxtl                                             
## hemisphrlft                                             
## hemsphrrght                                             
## Cndtnmrph:R                                             
## Cndtnrth:Rl  0.500                                      
## Cndtnsm:Rlt  0.500    0.500                             
## Cndtnmrph:_  0.000    0.000    0.000                    
## Cndtnrth:c_  0.000    0.000    0.000    0.500           
## Cndtnsm:cn_  0.000    0.000    0.000    0.500    0.500
lmerTest::anova(post1.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                          Sum Sq Mean Sq NumDF DenDF F.value    Pr(>F)    
## Condition                 88.20   29.40     3  1601   5.076  0.001685 ** 
## Related                   26.19   26.19     1    25   4.522  0.043523 *  
## center_lextale             0.00    0.00     1    24   0.001  0.979179    
## hemisphere               806.95  403.48     2  1601  69.659 < 2.2e-16 ***
## Condition:Related         58.34   19.45     3  1601   3.357  0.018198 *  
## Condition:center_lextale  62.96   20.99     3  1601   3.623  0.012641 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

posterior, 100 - 300

Summarizing the 100-300 time-window for L2 group (n=26)

  • Morph, orth, and sem all have different patterns of priming compared to the ID baseline. Voltage maps show strong positivities in anterior for ID, and anterior negativities in morph. Orth has very little going on in this time window

300-500 ms time-window, omnibus

t3.1<-lmer(mean~Condition*Related*center_lextale*hemisphere*antpos+(1+Related|Subject),time300)

#step(t3.1)

t3.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + antpos + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale + center_lextale:hemisphere + Condition:antpos + 
    Related:antpos + center_lextale:antpos + hemisphere:antpos + 
    Condition:Related:antpos, data = time300)

summary(t3.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: 
## mean ~ Condition + Related + center_lextale + hemisphere + antpos +  
##     (1 + Related | Subject) + Condition:Related + Condition:center_lextale +  
##     center_lextale:hemisphere + Condition:antpos + Related:antpos +  
##     center_lextale:antpos + hemisphere:antpos + Condition:Related:antpos
##    Data: time300
## 
## REML criterion at convergence: 20867.1
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -7.4558 -0.5542  0.0209  0.5632  7.0117 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 5.0076   2.2378        
##           Relatedrel  0.8513   0.9226   -0.32
##  Residual             8.5623   2.9261        
## Number of obs: 4160, groups:  Subject, 26
## 
## Fixed effects:
##                                        Estimate Std. Error         df
## (Intercept)                             0.44344    0.53981   53.00000
## Conditionmorph                          0.42197    0.36294 4073.00000
## Conditionorth                          -0.20814    0.36294 4073.00000
## Conditionsem                           -0.15301    0.36294 4073.00000
## Relatedrel                              0.75476    0.40555  382.00000
## center_lextale                         10.42571    5.18969   30.00000
## hemisphereleft                         -0.23266    0.24849 4073.00000
## hemisphereright                         1.15698    0.24849 4073.00000
## antposant                              -0.42999    0.42559 4073.00000
## antpospost                              1.36799    0.39421 4073.00000
## Conditionmorph:Relatedrel              -0.69064    0.51328 4073.00000
## Conditionorth:Relatedrel                0.06445    0.51328 4073.00000
## Conditionsem:Relatedrel                -0.49985    0.51328 4073.00000
## Conditionmorph:center_lextale          -3.35363    1.50253 4073.00000
## Conditionorth:center_lextale           -3.79367    1.50253 4073.00000
## Conditionsem:center_lextale            -1.49759    1.50253 4073.00000
## center_lextale:hemisphereleft           2.04571    1.46303 4073.00000
## center_lextale:hemisphereright         -1.47720    1.46303 4073.00000
## Conditionmorph:antposant                0.56842    0.47521 4073.00000
## Conditionorth:antposant                 0.52195    0.47521 4073.00000
## Conditionsem:antposant                  0.01979    0.47521 4073.00000
## Conditionmorph:antpospost              -0.29944    0.46266 4073.00000
## Conditionorth:antpospost                0.19471    0.46266 4073.00000
## Conditionsem:antpospost                 0.18948    0.46266 4073.00000
## Relatedrel:antposant                   -0.39023    0.47521 4073.00000
## Relatedrel:antpospost                   0.71315    0.46266 4073.00000
## center_lextale:antposant                0.70194    1.39317 4073.00000
## center_lextale:antpospost              -6.58980    1.35601 4073.00000
## hemisphereleft:antposant               -0.88556    0.34152 4073.00000
## hemisphereright:antposant              -0.44679    0.34152 4073.00000
## hemisphereleft:antpospost              -1.37824    0.30992 4073.00000
## hemisphereright:antpospost             -1.70650    0.30992 4073.00000
## Conditionmorph:Relatedrel:antposant    -0.49722    0.67204 4073.00000
## Conditionorth:Relatedrel:antposant     -0.11412    0.67204 4073.00000
## Conditionsem:Relatedrel:antposant       0.51484    0.67204 4073.00000
## Conditionmorph:Relatedrel:antpospost    0.36082    0.65431 4073.00000
## Conditionorth:Relatedrel:antpospost    -0.76067    0.65431 4073.00000
## Conditionsem:Relatedrel:antpospost     -0.83146    0.65431 4073.00000
##                                      t value Pr(>|t|)    
## (Intercept)                            0.821 0.415085    
## Conditionmorph                         1.163 0.245046    
## Conditionorth                         -0.573 0.566359    
## Conditionsem                          -0.422 0.673348    
## Relatedrel                             1.861 0.063502 .  
## center_lextale                         2.009 0.053623 .  
## hemisphereleft                        -0.936 0.349180    
## hemisphereright                        4.656 3.33e-06 ***
## antposant                             -1.010 0.312388    
## antpospost                             3.470 0.000525 ***
## Conditionmorph:Relatedrel             -1.346 0.178523    
## Conditionorth:Relatedrel               0.126 0.900084    
## Conditionsem:Relatedrel               -0.974 0.330199    
## Conditionmorph:center_lextale         -2.232 0.025670 *  
## Conditionorth:center_lextale          -2.525 0.011612 *  
## Conditionsem:center_lextale           -0.997 0.318963    
## center_lextale:hemisphereleft          1.398 0.162108    
## center_lextale:hemisphereright        -1.010 0.312704    
## Conditionmorph:antposant               1.196 0.231704    
## Conditionorth:antposant                1.098 0.272108    
## Conditionsem:antposant                 0.042 0.966780    
## Conditionmorph:antpospost             -0.647 0.517530    
## Conditionorth:antpospost               0.421 0.673896    
## Conditionsem:antpospost                0.410 0.682162    
## Relatedrel:antposant                  -0.821 0.411596    
## Relatedrel:antpospost                  1.541 0.123298    
## center_lextale:antposant               0.504 0.614398    
## center_lextale:antpospost             -4.860 1.22e-06 ***
## hemisphereleft:antposant              -2.593 0.009548 ** 
## hemisphereright:antposant             -1.308 0.190859    
## hemisphereleft:antpospost             -4.447 8.94e-06 ***
## hemisphereright:antpospost            -5.506 3.89e-08 ***
## Conditionmorph:Relatedrel:antposant   -0.740 0.459425    
## Conditionorth:Relatedrel:antposant    -0.170 0.865168    
## Conditionsem:Relatedrel:antposant      0.766 0.443674    
## Conditionmorph:Relatedrel:antpospost   0.551 0.581351    
## Conditionorth:Relatedrel:antpospost   -1.163 0.245075    
## Conditionsem:Relatedrel:antpospost    -1.271 0.203890    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
lmerTest::anova(t3.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                            Sum Sq Mean Sq NumDF  DenDF F.value    Pr(>F)
## Condition                  150.04   50.01     3 4073.0   5.841 0.0005609
## Related                     45.84   45.84     1   25.4   5.354 0.0290422
## center_lextale              14.95   14.95     1   24.1   1.746 0.1988465
## hemisphere                1678.11  839.05     2 4073.0  97.993 < 2.2e-16
## antpos                    1235.27  617.64     2 4073.0  72.134 < 2.2e-16
## Condition:Related           86.22   28.74     3 4073.0   3.357 0.0180726
## Condition:center_lextale    69.77   23.26     3 4073.0   2.716 0.0431796
## center_lextale:hemisphere   75.70   37.85     2 4073.0   4.420 0.0120860
## Condition:antpos            47.58    7.93     6 4073.0   0.926 0.4747911
## Related:antpos             130.53   65.27     2 4073.0   7.622 0.0004963
## center_lextale:antpos      354.89  177.44     2 4073.0  20.724 1.110e-09
## hemisphere:antpos          365.41   91.35     4 4073.0  10.669 1.336e-08
## Condition:Related:antpos   134.72   22.45     6 4073.0   2.622 0.0153907
##                              
## Condition                 ***
## Related                   *  
## center_lextale               
## hemisphere                ***
## antpos                    ***
## Condition:Related         *  
## Condition:center_lextale  *  
## center_lextale:hemisphere *  
## Condition:antpos             
## Related:antpos            ***
## center_lextale:antpos     ***
## hemisphere:antpos         ***
## Condition:Related:antpos  *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

300-500 ombinbus

  • relatedness (marginal in id)
  • center_lextale (marginal)
  • condition x center_lextale
  • center_lextale x antpos (post)
  • hemisphere x ant

Resolve interaction by separating by antpos

ant300<-time300[time300$antpos=="ant",]
cent300<-time300[time300$antpos=="central",]
post300<-time300[time300$antpos=="post",]
ant3.1<-lmer(mean~Condition*Related*center_lextale*hemisphere+(1+Related|Subject),ant300)
summary(ant3.1)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition * Related * center_lextale * hemisphere + (1 +  
##     Related | Subject)
##    Data: ant300
## 
## REML criterion at convergence: 7088.9
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.9848 -0.4884  0.0329  0.5147  5.2951 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 12.752   3.571         
##           Relatedrel   1.469   1.212    -0.11
##  Residual              7.733   2.781         
## Number of obs: 1456, groups:  Subject, 26
## 
## Fixed effects:
##                                                            Estimate
## (Intercept)                                               6.598e-02
## Conditionmorph                                            6.754e-01
## Conditionorth                                             5.593e-02
## Conditionsem                                             -2.733e-01
## Relatedrel                                                6.185e-01
## center_lextale                                            1.282e+01
## hemisphereleft                                           -1.239e+00
## hemisphereright                                           7.087e-01
## Conditionmorph:Relatedrel                                -1.127e+00
## Conditionorth:Relatedrel                                  8.294e-02
## Conditionsem:Relatedrel                                  -1.890e-01
## Conditionmorph:center_lextale                            -6.873e+00
## Conditionorth:center_lextale                             -4.274e+00
## Conditionsem:center_lextale                               3.228e+00
## Relatedrel:center_lextale                                 1.587e-02
## Conditionmorph:hemisphereleft                             4.129e-01
## Conditionorth:hemisphereleft                              4.050e-01
## Conditionsem:hemisphereleft                               4.555e-01
## Conditionmorph:hemisphereright                            3.220e-01
## Conditionorth:hemisphereright                             1.967e-01
## Conditionsem:hemisphereright                             -1.286e-01
## Relatedrel:hemisphereleft                                -4.276e-01
## Relatedrel:hemisphereright                               -1.651e-01
## center_lextale:hemisphereleft                            -4.907e+00
## center_lextale:hemisphereright                           -4.847e+00
## Conditionmorph:Relatedrel:center_lextale                 -1.126e+00
## Conditionorth:Relatedrel:center_lextale                  -4.991e+00
## Conditionsem:Relatedrel:center_lextale                   -1.091e+01
## Conditionmorph:Relatedrel:hemisphereleft                 -3.982e-03
## Conditionorth:Relatedrel:hemisphereleft                  -3.876e-02
## Conditionsem:Relatedrel:hemisphereleft                    1.747e-01
## Conditionmorph:Relatedrel:hemisphereright                -1.384e-01
## Conditionorth:Relatedrel:hemisphereright                 -2.707e-01
## Conditionsem:Relatedrel:hemisphereright                   3.013e-01
## Conditionmorph:center_lextale:hemisphereleft              8.071e+00
## Conditionorth:center_lextale:hemisphereleft               6.741e+00
## Conditionsem:center_lextale:hemisphereleft                5.118e+00
## Conditionmorph:center_lextale:hemisphereright             9.462e+00
## Conditionorth:center_lextale:hemisphereright              8.445e+00
## Conditionsem:center_lextale:hemisphereright               6.150e+00
## Relatedrel:center_lextale:hemisphereleft                  3.256e+00
## Relatedrel:center_lextale:hemisphereright                 5.467e+00
## Conditionmorph:Relatedrel:center_lextale:hemisphereleft  -2.465e+00
## Conditionorth:Relatedrel:center_lextale:hemisphereleft   -3.227e+00
## Conditionsem:Relatedrel:center_lextale:hemisphereleft    -9.772e-01
## Conditionmorph:Relatedrel:center_lextale:hemisphereright -7.067e+00
## Conditionorth:Relatedrel:center_lextale:hemisphereright  -4.255e+00
## Conditionsem:Relatedrel:center_lextale:hemisphereright   -7.811e+00
##                                                          Std. Error
## (Intercept)                                               8.876e-01
## Conditionmorph                                            7.713e-01
## Conditionorth                                             7.713e-01
## Conditionsem                                              7.713e-01
## Relatedrel                                                8.071e-01
## center_lextale                                            1.039e+01
## hemisphereleft                                            6.297e-01
## hemisphereright                                           6.297e-01
## Conditionmorph:Relatedrel                                 1.091e+00
## Conditionorth:Relatedrel                                  1.091e+00
## Conditionsem:Relatedrel                                   1.091e+00
## Conditionmorph:center_lextale                             9.031e+00
## Conditionorth:center_lextale                              9.031e+00
## Conditionsem:center_lextale                               9.031e+00
## Relatedrel:center_lextale                                 9.450e+00
## Conditionmorph:hemisphereleft                             8.906e-01
## Conditionorth:hemisphereleft                              8.906e-01
## Conditionsem:hemisphereleft                               8.906e-01
## Conditionmorph:hemisphereright                            8.906e-01
## Conditionorth:hemisphereright                             8.906e-01
## Conditionsem:hemisphereright                              8.906e-01
## Relatedrel:hemisphereleft                                 8.906e-01
## Relatedrel:hemisphereright                                8.906e-01
## center_lextale:hemisphereleft                             7.374e+00
## center_lextale:hemisphereright                            7.374e+00
## Conditionmorph:Relatedrel:center_lextale                  1.277e+01
## Conditionorth:Relatedrel:center_lextale                   1.277e+01
## Conditionsem:Relatedrel:center_lextale                    1.277e+01
## Conditionmorph:Relatedrel:hemisphereleft                  1.259e+00
## Conditionorth:Relatedrel:hemisphereleft                   1.259e+00
## Conditionsem:Relatedrel:hemisphereleft                    1.259e+00
## Conditionmorph:Relatedrel:hemisphereright                 1.259e+00
## Conditionorth:Relatedrel:hemisphereright                  1.259e+00
## Conditionsem:Relatedrel:hemisphereright                   1.259e+00
## Conditionmorph:center_lextale:hemisphereleft              1.043e+01
## Conditionorth:center_lextale:hemisphereleft               1.043e+01
## Conditionsem:center_lextale:hemisphereleft                1.043e+01
## Conditionmorph:center_lextale:hemisphereright             1.043e+01
## Conditionorth:center_lextale:hemisphereright              1.043e+01
## Conditionsem:center_lextale:hemisphereright               1.043e+01
## Relatedrel:center_lextale:hemisphereleft                  1.043e+01
## Relatedrel:center_lextale:hemisphereright                 1.043e+01
## Conditionmorph:Relatedrel:center_lextale:hemisphereleft   1.475e+01
## Conditionorth:Relatedrel:center_lextale:hemisphereleft    1.475e+01
## Conditionsem:Relatedrel:center_lextale:hemisphereleft     1.475e+01
## Conditionmorph:Relatedrel:center_lextale:hemisphereright  1.475e+01
## Conditionorth:Relatedrel:center_lextale:hemisphereright   1.475e+01
## Conditionsem:Relatedrel:center_lextale:hemisphereright    1.475e+01
##                                                                  df
## (Intercept)                                               5.900e+01
## Conditionmorph                                            1.360e+03
## Conditionorth                                             1.360e+03
## Conditionsem                                              1.360e+03
## Relatedrel                                                8.590e+02
## center_lextale                                            5.900e+01
## hemisphereleft                                            1.360e+03
## hemisphereright                                           1.360e+03
## Conditionmorph:Relatedrel                                 1.360e+03
## Conditionorth:Relatedrel                                  1.360e+03
## Conditionsem:Relatedrel                                   1.360e+03
## Conditionmorph:center_lextale                             1.360e+03
## Conditionorth:center_lextale                              1.360e+03
## Conditionsem:center_lextale                               1.360e+03
## Relatedrel:center_lextale                                 8.590e+02
## Conditionmorph:hemisphereleft                             1.360e+03
## Conditionorth:hemisphereleft                              1.360e+03
## Conditionsem:hemisphereleft                               1.360e+03
## Conditionmorph:hemisphereright                            1.360e+03
## Conditionorth:hemisphereright                             1.360e+03
## Conditionsem:hemisphereright                              1.360e+03
## Relatedrel:hemisphereleft                                 1.360e+03
## Relatedrel:hemisphereright                                1.360e+03
## center_lextale:hemisphereleft                             1.360e+03
## center_lextale:hemisphereright                            1.360e+03
## Conditionmorph:Relatedrel:center_lextale                  1.360e+03
## Conditionorth:Relatedrel:center_lextale                   1.360e+03
## Conditionsem:Relatedrel:center_lextale                    1.360e+03
## Conditionmorph:Relatedrel:hemisphereleft                  1.360e+03
## Conditionorth:Relatedrel:hemisphereleft                   1.360e+03
## Conditionsem:Relatedrel:hemisphereleft                    1.360e+03
## Conditionmorph:Relatedrel:hemisphereright                 1.360e+03
## Conditionorth:Relatedrel:hemisphereright                  1.360e+03
## Conditionsem:Relatedrel:hemisphereright                   1.360e+03
## Conditionmorph:center_lextale:hemisphereleft              1.360e+03
## Conditionorth:center_lextale:hemisphereleft               1.360e+03
## Conditionsem:center_lextale:hemisphereleft                1.360e+03
## Conditionmorph:center_lextale:hemisphereright             1.360e+03
## Conditionorth:center_lextale:hemisphereright              1.360e+03
## Conditionsem:center_lextale:hemisphereright               1.360e+03
## Relatedrel:center_lextale:hemisphereleft                  1.360e+03
## Relatedrel:center_lextale:hemisphereright                 1.360e+03
## Conditionmorph:Relatedrel:center_lextale:hemisphereleft   1.360e+03
## Conditionorth:Relatedrel:center_lextale:hemisphereleft    1.360e+03
## Conditionsem:Relatedrel:center_lextale:hemisphereleft     1.360e+03
## Conditionmorph:Relatedrel:center_lextale:hemisphereright  1.360e+03
## Conditionorth:Relatedrel:center_lextale:hemisphereright   1.360e+03
## Conditionsem:Relatedrel:center_lextale:hemisphereright    1.360e+03
##                                                          t value Pr(>|t|)
## (Intercept)                                                0.074   0.9410
## Conditionmorph                                             0.876   0.3813
## Conditionorth                                              0.073   0.9422
## Conditionsem                                              -0.354   0.7231
## Relatedrel                                                 0.766   0.4436
## center_lextale                                             1.233   0.2223
## hemisphereleft                                            -1.968   0.0493
## hemisphereright                                            1.125   0.2606
## Conditionmorph:Relatedrel                                 -1.033   0.3017
## Conditionorth:Relatedrel                                   0.076   0.9394
## Conditionsem:Relatedrel                                   -0.173   0.8625
## Conditionmorph:center_lextale                             -0.761   0.4468
## Conditionorth:center_lextale                              -0.473   0.6361
## Conditionsem:center_lextale                                0.357   0.7208
## Relatedrel:center_lextale                                  0.002   0.9987
## Conditionmorph:hemisphereleft                              0.464   0.6430
## Conditionorth:hemisphereleft                               0.455   0.6493
## Conditionsem:hemisphereleft                                0.511   0.6091
## Conditionmorph:hemisphereright                             0.362   0.7177
## Conditionorth:hemisphereright                              0.221   0.8252
## Conditionsem:hemisphereright                              -0.144   0.8852
## Relatedrel:hemisphereleft                                 -0.480   0.6312
## Relatedrel:hemisphereright                                -0.185   0.8529
## center_lextale:hemisphereleft                             -0.665   0.5059
## center_lextale:hemisphereright                            -0.657   0.5111
## Conditionmorph:Relatedrel:center_lextale                  -0.088   0.9297
## Conditionorth:Relatedrel:center_lextale                   -0.391   0.6960
## Conditionsem:Relatedrel:center_lextale                    -0.854   0.3930
## Conditionmorph:Relatedrel:hemisphereleft                  -0.003   0.9975
## Conditionorth:Relatedrel:hemisphereleft                   -0.031   0.9755
## Conditionsem:Relatedrel:hemisphereleft                     0.139   0.8897
## Conditionmorph:Relatedrel:hemisphereright                 -0.110   0.9125
## Conditionorth:Relatedrel:hemisphereright                  -0.215   0.8299
## Conditionsem:Relatedrel:hemisphereright                    0.239   0.8110
## Conditionmorph:center_lextale:hemisphereleft               0.774   0.4391
## Conditionorth:center_lextale:hemisphereleft                0.646   0.5181
## Conditionsem:center_lextale:hemisphereleft                 0.491   0.6236
## Conditionmorph:center_lextale:hemisphereright              0.907   0.3644
## Conditionorth:center_lextale:hemisphereright               0.810   0.4182
## Conditionsem:center_lextale:hemisphereright                0.590   0.5554
## Relatedrel:center_lextale:hemisphereleft                   0.312   0.7549
## Relatedrel:center_lextale:hemisphereright                  0.524   0.6001
## Conditionmorph:Relatedrel:center_lextale:hemisphereleft   -0.167   0.8673
## Conditionorth:Relatedrel:center_lextale:hemisphereleft    -0.219   0.8268
## Conditionsem:Relatedrel:center_lextale:hemisphereleft     -0.066   0.9472
## Conditionmorph:Relatedrel:center_lextale:hemisphereright  -0.479   0.6319
## Conditionorth:Relatedrel:center_lextale:hemisphereright   -0.289   0.7730
## Conditionsem:Relatedrel:center_lextale:hemisphereright    -0.530   0.5964
##                                                           
## (Intercept)                                               
## Conditionmorph                                            
## Conditionorth                                             
## Conditionsem                                              
## Relatedrel                                                
## center_lextale                                            
## hemisphereleft                                           *
## hemisphereright                                           
## Conditionmorph:Relatedrel                                 
## Conditionorth:Relatedrel                                  
## Conditionsem:Relatedrel                                   
## Conditionmorph:center_lextale                             
## Conditionorth:center_lextale                              
## Conditionsem:center_lextale                               
## Relatedrel:center_lextale                                 
## Conditionmorph:hemisphereleft                             
## Conditionorth:hemisphereleft                              
## Conditionsem:hemisphereleft                               
## Conditionmorph:hemisphereright                            
## Conditionorth:hemisphereright                             
## Conditionsem:hemisphereright                              
## Relatedrel:hemisphereleft                                 
## Relatedrel:hemisphereright                                
## center_lextale:hemisphereleft                             
## center_lextale:hemisphereright                            
## Conditionmorph:Relatedrel:center_lextale                  
## Conditionorth:Relatedrel:center_lextale                   
## Conditionsem:Relatedrel:center_lextale                    
## Conditionmorph:Relatedrel:hemisphereleft                  
## Conditionorth:Relatedrel:hemisphereleft                   
## Conditionsem:Relatedrel:hemisphereleft                    
## Conditionmorph:Relatedrel:hemisphereright                 
## Conditionorth:Relatedrel:hemisphereright                  
## Conditionsem:Relatedrel:hemisphereright                   
## Conditionmorph:center_lextale:hemisphereleft              
## Conditionorth:center_lextale:hemisphereleft               
## Conditionsem:center_lextale:hemisphereleft                
## Conditionmorph:center_lextale:hemisphereright             
## Conditionorth:center_lextale:hemisphereright              
## Conditionsem:center_lextale:hemisphereright               
## Relatedrel:center_lextale:hemisphereleft                  
## Relatedrel:center_lextale:hemisphereright                 
## Conditionmorph:Relatedrel:center_lextale:hemisphereleft   
## Conditionorth:Relatedrel:center_lextale:hemisphereleft    
## Conditionsem:Relatedrel:center_lextale:hemisphereleft     
## Conditionmorph:Relatedrel:center_lextale:hemisphereright  
## Conditionorth:Relatedrel:center_lextale:hemisphereright   
## Conditionsem:Relatedrel:center_lextale:hemisphereright    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
#step(ant3.1)

ant3.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale + Related:center_lextale + Condition:Related:center_lextale, 
    data = ant300)

summary(ant3.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition + Related + center_lextale + hemisphere + (1 +  
##     Related | Subject) + Condition:Related + Condition:center_lextale +  
##     Related:center_lextale + Condition:Related:center_lextale
##    Data: ant300
## 
## REML criterion at convergence: 7192.4
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.1274 -0.5059  0.0328  0.5230  5.2769 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 12.757   3.572         
##           Relatedrel   1.479   1.216    -0.11
##  Residual              7.598   2.757         
## Number of obs: 1456, groups:  Subject, 26
## 
## Fixed effects:
##                                            Estimate Std. Error         df
## (Intercept)                                 0.01345    0.75080   30.40000
## Conditionmorph                              0.99039    0.28896 1390.00000
## Conditionorth                               0.31381    0.28896 1390.00000
## Conditionsem                               -0.13322    0.28896 1390.00000
## Relatedrel                                  0.36453    0.37468   77.40000
## center_lextale                              8.63872    8.54364   27.10000
## hemisphereleft                             -1.11822    0.22070 1390.00000
## hemisphereright                             0.71018    0.22070 1390.00000
## Conditionmorph:Relatedrel                  -1.18786    0.40865 1390.00000
## Conditionorth:Relatedrel                   -0.04967    0.40865 1390.00000
## Conditionsem:Relatedrel                     0.01499    0.40865 1390.00000
## Conditionmorph:center_lextale               0.64112    3.38352 1390.00000
## Conditionorth:center_lextale                2.23390    3.38352 1390.00000
## Conditionsem:center_lextale                 8.05768    3.38352 1390.00000
## Relatedrel:center_lextale                   3.75436    4.38725   77.40000
## Conditionmorph:Relatedrel:center_lextale   -5.21133    4.78502 1390.00000
## Conditionorth:Relatedrel:center_lextale    -8.19755    4.78502 1390.00000
## Conditionsem:Relatedrel:center_lextale    -14.67843    4.78502 1390.00000
##                                          t value Pr(>|t|)    
## (Intercept)                                0.018 0.985827    
## Conditionmorph                             3.427 0.000627 ***
## Conditionorth                              1.086 0.277664    
## Conditionsem                              -0.461 0.644848    
## Relatedrel                                 0.973 0.333629    
## center_lextale                             1.011 0.320901    
## hemisphereleft                            -5.067 4.59e-07 ***
## hemisphereright                            3.218 0.001321 ** 
## Conditionmorph:Relatedrel                 -2.907 0.003710 ** 
## Conditionorth:Relatedrel                  -0.122 0.903277    
## Conditionsem:Relatedrel                    0.037 0.970746    
## Conditionmorph:center_lextale              0.189 0.849741    
## Conditionorth:center_lextale               0.660 0.509216    
## Conditionsem:center_lextale                2.381 0.017379 *  
## Relatedrel:center_lextale                  0.856 0.394782    
## Conditionmorph:Relatedrel:center_lextale  -1.089 0.276302    
## Conditionorth:Relatedrel:center_lextale   -1.713 0.086904 .  
## Conditionsem:Relatedrel:center_lextale    -3.068 0.002200 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) Cndtnm Cndtnr Cndtns Rltdrl cntr_l hmsphrl hmsphrr
## Conditnmrph -0.192                                                   
## Conditinrth -0.192  0.500                                            
## Conditionsm -0.192  0.500  0.500                                     
## Relatedrel  -0.216  0.386  0.386  0.386                              
## center_lxtl  0.000  0.000  0.000  0.000  0.000                       
## hemisphrlft -0.220  0.000  0.000  0.000  0.000  0.000                
## hemsphrrght -0.220  0.000  0.000  0.000  0.000  0.000  0.750         
## Cndtnmrph:R  0.136 -0.707 -0.354 -0.354 -0.545  0.000  0.000   0.000 
## Cndtnrth:Rl  0.136 -0.354 -0.707 -0.354 -0.545  0.000  0.000   0.000 
## Cndtnsm:Rlt  0.136 -0.354 -0.354 -0.707 -0.545  0.000  0.000   0.000 
## Cndtnmrph:_  0.000  0.000  0.000  0.000  0.000 -0.198  0.000   0.000 
## Cndtnrth:c_  0.000  0.000  0.000  0.000  0.000 -0.198  0.000   0.000 
## Cndtnsm:cn_  0.000  0.000  0.000  0.000  0.000 -0.198  0.000   0.000 
## Rltdrl:cnt_  0.000  0.000  0.000  0.000  0.000 -0.222  0.000   0.000 
## Cndtnmr:R:_  0.000  0.000  0.000  0.000  0.000  0.140  0.000   0.000 
## Cndtnrt:R:_  0.000  0.000  0.000  0.000  0.000  0.140  0.000   0.000 
## Cndtnsm:R:_  0.000  0.000  0.000  0.000  0.000  0.140  0.000   0.000 
##             Cndtnm:R Cndtnr:R Cndtns:R Cndtnm:_ Cndtnr:_ Cndtns:_ Rltd:_
## Conditnmrph                                                             
## Conditinrth                                                             
## Conditionsm                                                             
## Relatedrel                                                              
## center_lxtl                                                             
## hemisphrlft                                                             
## hemsphrrght                                                             
## Cndtnmrph:R                                                             
## Cndtnrth:Rl  0.500                                                      
## Cndtnsm:Rlt  0.500    0.500                                             
## Cndtnmrph:_  0.000    0.000    0.000                                    
## Cndtnrth:c_  0.000    0.000    0.000    0.500                           
## Cndtnsm:cn_  0.000    0.000    0.000    0.500    0.500                  
## Rltdrl:cnt_  0.000    0.000    0.000    0.386    0.386    0.386         
## Cndtnmr:R:_  0.000    0.000    0.000   -0.707   -0.354   -0.354   -0.545
## Cndtnrt:R:_  0.000    0.000    0.000   -0.354   -0.707   -0.354   -0.545
## Cndtnsm:R:_  0.000    0.000    0.000   -0.354   -0.354   -0.707   -0.545
##             Cndtnm:R:_ Cndtnr:R:_
## Conditnmrph                      
## Conditinrth                      
## Conditionsm                      
## Relatedrel                       
## center_lxtl                      
## hemisphrlft                      
## hemsphrrght                      
## Cndtnmrph:R                      
## Cndtnrth:Rl                      
## Cndtnsm:Rlt                      
## Cndtnmrph:_                      
## Cndtnrth:c_                      
## Cndtnsm:cn_                      
## Rltdrl:cnt_                      
## Cndtnmr:R:_                      
## Cndtnrt:R:_  0.500               
## Cndtnsm:R:_  0.500      0.500
lmerTest::anova(ant3.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                                   Sum Sq Mean Sq NumDF DenDF F.value
## Condition                          64.86   21.62     3  1390   2.845
## Related                             0.34    0.34     1    24   0.045
## center_lextale                     10.70   10.70     1    24   1.409
## hemisphere                       1050.46  525.23     2  1390  69.124
## Condition:Related                  94.65   31.55     3  1390   4.152
## Condition:center_lextale           14.43    4.81     3  1390   0.633
## Related:center_lextale              7.61    7.61     1    24   1.001
## Condition:Related:center_lextale   74.73   24.91     3  1390   3.278
##                                     Pr(>F)    
## Condition                         0.036526 *  
## Related                           0.834509    
## center_lextale                    0.246894    
## hemisphere                       < 2.2e-16 ***
## Condition:Related                 0.006117 ** 
## Condition:center_lextale          0.593849    
## Related:center_lextale            0.326963    
## Condition:Related:center_lextale  0.020311 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

anterior, 300-500

  • no effect of relatedness for id
  • effect of hemisphere (left and right)
  • condition x related (morph)
cent3.1<-lmer(mean~Condition*Related*center_lextale*hemisphere+(1+Related|Subject),cent300)

#step(cent3.1)
cent3.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + (1 + Related | Subject) + center_lextale:hemisphere, 
    data = cent300)

summary(cent3.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition + Related + center_lextale + hemisphere + (1 +  
##     Related | Subject) + center_lextale:hemisphere
##    Data: cent300
## 
## REML criterion at convergence: 4374.7
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -3.4819 -0.6057 -0.0026  0.5703  4.9740 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 5.446    2.334         
##           Relatedrel  1.004    1.002    -0.21
##  Residual             3.458    1.860         
## Number of obs: 1040, groups:  Subject, 26
## 
## Fixed effects:
##                                 Estimate Std. Error        df t value
## (Intercept)                      0.58420    0.48926  29.40000   1.194
## Conditionmorph                   0.07665    0.16310 981.00000   0.470
## Conditionorth                   -0.17591    0.16310 981.00000  -1.079
## Conditionsem                    -0.40294    0.16310 981.00000  -2.470
## Relatedrel                       0.47325    0.22786  25.00000   2.077
## center_lextale                   8.05496    5.45439  27.20000   1.477
## hemisphereleft                  -0.23266    0.15792 981.00000  -1.473
## hemisphereright                  1.15698    0.15792 981.00000   7.326
## center_lextale:hemisphereleft    4.07403    1.84914 981.00000   2.203
## center_lextale:hemisphereright  -1.58256    1.84914 981.00000  -0.856
##                                Pr(>|t|)    
## (Intercept)                      0.2420    
## Conditionmorph                   0.6385    
## Conditionorth                    0.2811    
## Conditionsem                     0.0137 *  
## Relatedrel                       0.0482 *  
## center_lextale                   0.1512    
## hemisphereleft                   0.1410    
## hemisphereright                4.93e-13 ***
## center_lextale:hemisphereleft    0.0278 *  
## center_lextale:hemisphereright   0.3923    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##                   (Intr) Cndtnm Cndtnr Cndtns Rltdrl cntr_l hmsphrl
## Conditnmrph       -0.167                                           
## Conditinrth       -0.167  0.500                                    
## Conditionsm       -0.167  0.500  0.500                             
## Relatedrel        -0.228  0.000  0.000  0.000                      
## center_lxtl        0.000  0.000  0.000  0.000  0.000               
## hemisphrlft       -0.215  0.000  0.000  0.000  0.000  0.000        
## hemsphrrght       -0.215  0.000  0.000  0.000  0.000  0.000  0.667 
## cntr_lxtl:hmsphrl  0.000  0.000  0.000  0.000  0.000 -0.226  0.000 
## cntr_lxtl:hmsphrr  0.000  0.000  0.000  0.000  0.000 -0.226  0.000 
##                   hmsphrr cntr_lxtl:hmsphrl
## Conditnmrph                                
## Conditinrth                                
## Conditionsm                                
## Relatedrel                                 
## center_lxtl                                
## hemisphrlft                                
## hemsphrrght                                
## cntr_lxtl:hmsphrl  0.000                   
## cntr_lxtl:hmsphrr  0.000   0.667
lmerTest::anova(cent3.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                           Sum Sq Mean Sq NumDF  DenDF F.value    Pr(>F)
## Condition                  35.39  11.798     3 981.00   3.411 0.0170448
## Related                    14.92  14.918     1  25.00   4.314 0.0482359
## center_lextale              9.76   9.759     1  24.09   2.822 0.1059085
## hemisphere                437.21 218.604     2 981.00  63.213 < 2.2e-16
## center_lextale:hemisphere  50.43  25.213     2 981.00   7.291 0.0007195
##                              
## Condition                 *  
## Related                   *  
## center_lextale               
## hemisphere                ***
## center_lextale:hemisphere ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

central, 300-500

  • effect of related (id)
  • lextale x hemisphere
  • intearction of condition x related not included in model

posterior, 300-500

post3.1<-lmer(mean~Condition*Related*center_lextale*hemisphere+(1+Related|Subject),post300)

#step(post3.1)

post3.final<-lmer(formula = mean ~ Condition + Related + center_lextale + 
    hemisphere + (1 + Related | Subject) + Condition:Related + 
    Condition:center_lextale + center_lextale:hemisphere, data = post300)
        
summary(post3.final)
## Linear mixed model fit by REML t-tests use Satterthwaite approximations
##   to degrees of freedom [lmerMod]
## Formula: mean ~ Condition + Related + center_lextale + hemisphere + (1 +  
##     Related | Subject) + Condition:Related + Condition:center_lextale +  
##     center_lextale:hemisphere
##    Data: post300
## 
## REML criterion at convergence: 7555.6
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -2.9204 -0.6059 -0.0308  0.5519  8.3405 
## 
## Random effects:
##  Groups   Name        Variance Std.Dev. Corr 
##  Subject  (Intercept) 5.1012   2.2586        
##           Relatedrel  0.9085   0.9532   -0.19
##  Residual             5.1016   2.2587        
## Number of obs: 1664, groups:  Subject, 26
## 
## Fixed effects:
##                                  Estimate Std. Error         df t value
## (Intercept)                       1.81144    0.47951   31.10000   3.778
## Conditionmorph                    0.12253    0.22148 1599.00000   0.553
## Conditionorth                    -0.01343    0.22148 1599.00000  -0.061
## Conditionsem                      0.03647    0.22148 1599.00000   0.165
## Relatedrel                        1.46791    0.28982   78.40000   5.065
## center_lextale                    6.16982    5.37262   28.80000   1.148
## hemisphereleft                   -1.61090    0.14297 1599.00000 -11.268
## hemisphereright                  -0.54952    0.14297 1599.00000  -3.844
## Conditionmorph:Relatedrel        -0.32982    0.31322 1599.00000  -1.053
## Conditionorth:Relatedrel         -0.69622    0.31322 1599.00000  -2.223
## Conditionsem:Relatedrel          -1.33131    0.31322 1599.00000  -4.250
## Conditionmorph:center_lextale    -4.22891    1.83380 1599.00000  -2.306
## Conditionorth:center_lextale     -5.59523    1.83380 1599.00000  -3.051
## Conditionsem:center_lextale      -2.74466    1.83380 1599.00000  -1.497
## center_lextale:hemisphereleft     2.38545    1.67402 1599.00000   1.425
## center_lextale:hemisphereright   -3.87740    1.67402 1599.00000  -2.316
##                                Pr(>|t|)    
## (Intercept)                    0.000673 ***
## Conditionmorph                 0.580190    
## Conditionorth                  0.951654    
## Conditionsem                   0.869234    
## Relatedrel                     2.65e-06 ***
## center_lextale                 0.260257    
## hemisphereleft                  < 2e-16 ***
## hemisphereright                0.000126 ***
## Conditionmorph:Relatedrel      0.292500    
## Conditionorth:Relatedrel       0.026370 *  
## Conditionsem:Relatedrel        2.26e-05 ***
## Conditionmorph:center_lextale  0.021233 *  
## Conditionorth:center_lextale   0.002317 ** 
## Conditionsem:center_lextale    0.134666    
## center_lextale:hemisphereleft  0.154358    
## center_lextale:hemisphereright 0.020672 *  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##                   (Intr) Cndtnm Cndtnr Cndtns Rltdrl cntr_l hmsphrl
## Conditnmrph       -0.231                                           
## Conditinrth       -0.231  0.500                                    
## Conditionsm       -0.231  0.500  0.500                             
## Relatedrel        -0.290  0.382  0.382  0.382                      
## center_lxtl        0.000  0.000  0.000  0.000  0.000               
## hemisphrlft       -0.179  0.000  0.000  0.000  0.000  0.000        
## hemsphrrght       -0.179  0.000  0.000  0.000  0.000  0.000  0.600 
## Cndtnmrph:R        0.163 -0.707 -0.354 -0.354 -0.540  0.000  0.000 
## Cndtnrth:Rl        0.163 -0.354 -0.707 -0.354 -0.540  0.000  0.000 
## Cndtnsm:Rlt        0.163 -0.354 -0.354 -0.707 -0.540  0.000  0.000 
## Cndtnmrph:_        0.000  0.000  0.000  0.000  0.000 -0.171  0.000 
## Cndtnrth:c_        0.000  0.000  0.000  0.000  0.000 -0.171  0.000 
## Cndtnsm:cn_        0.000  0.000  0.000  0.000  0.000 -0.171  0.000 
## cntr_lxtl:hmsphrl  0.000  0.000  0.000  0.000  0.000 -0.187  0.000 
## cntr_lxtl:hmsphrr  0.000  0.000  0.000  0.000  0.000 -0.187  0.000 
##                   hmsphrr Cndtnm:R Cndtnr:R Cndtns:R Cndtnm:_ Cndtnr:_
## Conditnmrph                                                           
## Conditinrth                                                           
## Conditionsm                                                           
## Relatedrel                                                            
## center_lxtl                                                           
## hemisphrlft                                                           
## hemsphrrght                                                           
## Cndtnmrph:R        0.000                                              
## Cndtnrth:Rl        0.000   0.500                                      
## Cndtnsm:Rlt        0.000   0.500    0.500                             
## Cndtnmrph:_        0.000   0.000    0.000    0.000                    
## Cndtnrth:c_        0.000   0.000    0.000    0.000    0.500           
## Cndtnsm:cn_        0.000   0.000    0.000    0.000    0.500    0.500  
## cntr_lxtl:hmsphrl  0.000   0.000    0.000    0.000    0.000    0.000  
## cntr_lxtl:hmsphrr  0.000   0.000    0.000    0.000    0.000    0.000  
##                   Cndtns:_ cntr_lxtl:hmsphrl
## Conditnmrph                                 
## Conditinrth                                 
## Conditionsm                                 
## Relatedrel                                  
## center_lxtl                                 
## hemisphrlft                                 
## hemsphrrght                                 
## Cndtnmrph:R                                 
## Cndtnrth:Rl                                 
## Cndtnsm:Rlt                                 
## Cndtnmrph:_                                 
## Cndtnrth:c_                                 
## Cndtnsm:cn_                                 
## cntr_lxtl:hmsphrl  0.000                    
## cntr_lxtl:hmsphrr  0.000    0.600
lmerTest::anova(post3.final)
## Analysis of Variance Table of type III  with  Satterthwaite 
## approximation for degrees of freedom
##                           Sum Sq Mean Sq NumDF   DenDF F.value    Pr(>F)
## Condition                 108.81   36.27     3 1599.00   7.109 9.597e-05
## Related                    83.42   83.42     1   25.00  16.351 0.0004429
## center_lextale              1.24    1.24     1   24.03   0.243 0.6265953
## hemisphere                715.54  357.77     2 1599.00  70.129 < 2.2e-16
## Condition:Related         101.57   33.86     3 1599.00   6.636 0.0001874
## Condition:center_lextale   52.28   17.43     3 1599.00   3.416 0.0168031
## center_lextale:hemisphere  90.52   45.26     2 1599.00   8.872 0.0001473
##                              
## Condition                 ***
## Related                   ***
## center_lextale               
## hemisphere                ***
## Condition:Related         ***
## Condition:center_lextale  *  
## center_lextale:hemisphere ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1

posterior, 300-500

  • effect of relatedness (id)
  • effect of hemisphere (left and right)
  • condition x related (orth and sem, NOT morph)

Summary 300-500, L2

  • Like native speakers, in the posterior region there is an effect of relatedness, and an interaction of condition x relatedness for Orth and Sem. This means that in this region there is equivalent attenuation of the negativity in ID and Morph conditions, and it cannot be attributed to orthographic or semantic overlap. This is not modulated by proficiency (centered_lextale)

  • Like the L1 group, the effect is strongest at the midline