Attaching Data

Checking Packages

library("lavaan")
library("effects")
library("psych")
library("lme4")
library("lmerTest")
library("sjstats")
library("sjmisc")
library("tidyverse")
library("tinytex")

Centering Variables

Corrected_EmotionPaper_Data_Quartiles$ID<- as.factor(Corrected_EmotionPaper_Data_Quartiles$ID)
Corrected_EmotionPaper_Data_Quartiles$zArousal<-scale(Corrected_EmotionPaper_Data_Quartiles$Arousal_Mean_Sum, scale=TRUE, center=TRUE)
Corrected_EmotionPaper_Data_Quartiles$zValence<-scale(Corrected_EmotionPaper_Data_Quartiles$Valence_Mean_Sum, scale=TRUE, center=TRUE)
Corrected_EmotionPaper_Data_Quartiles$zWordConcreteness<-scale(Corrected_EmotionPaper_Data_Quartiles$Word_concreteness_z_score, scale=TRUE, center=TRUE)
Corrected_EmotionPaper_Data_Quartiles$zNarrativity<-scale(Corrected_EmotionPaper_Data_Quartiles$Narrativity, scale=TRUE, center=TRUE)
Corrected_EmotionPaper_Data_Quartiles$zDeepCohesion<-scale(Corrected_EmotionPaper_Data_Quartiles$Deep_cohesion_z_score, scale=TRUE, center=TRUE)
Corrected_EmotionPaper_Data_Quartiles$zRefCohesion<-scale(Corrected_EmotionPaper_Data_Quartiles$Referential_cohesion_z_score, scale=TRUE, center=TRUE)

Corrected_EmotionPaper_Data_Quartiles$zSyntacticSimplicity<-scale(Corrected_EmotionPaper_Data_Quartiles$Syntactic_simplicity_z_score, scale=TRUE, center=TRUE)
Corrected_EmotionPaper_Data_Quartiles$zWordAttack<-scale(Corrected_EmotionPaper_Data_Quartiles$WJ.III.Word.Attack.Standard.Score, scale=TRUE, center=TRUE)

Coh-Metrix Base Model from paper

M1 = glmer(GatesScore ~  zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M1)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7922.7   7964.6  -3955.4   7910.7     7914 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.5222 -0.6115  0.3311  0.5469  2.9677 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.73     1.315   
## Number of obs: 7920, groups:  ID, 165
## 
## Fixed effects:
##                   Estimate Std. Error z value Pr(>|z|)    
## (Intercept)        1.20382    0.10784  11.163  < 2e-16 ***
## zNarrativity       0.17931    0.04186   4.284 1.84e-05 ***
## zWordConcreteness -0.17980    0.03694  -4.867 1.13e-06 ***
## zRefCohesion       0.03088    0.03859   0.800    0.424    
## zDeepCohesion      0.31464    0.02986  10.537  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs
## zNarrativty  0.013                     
## zWrdCncrtns -0.018  0.587              
## zRefCohesin  0.005 -0.653 -0.481       
## zDeepCohesn  0.035 -0.032 -0.159 -0.094

Model with syntactic simplicity

M2 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M2)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion + zSyntacticSimplicity + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7857.2   7906.1  -3921.6   7843.2     7913 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.4803 -0.5913  0.3288  0.5399  2.8033 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.76     1.327   
## Number of obs: 7920, groups:  ID, 165
## 
## Fixed effects:
##                      Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           1.22179    0.10878  11.231  < 2e-16 ***
## zNarrativity          0.20785    0.04221   4.924 8.47e-07 ***
## zWordConcreteness    -0.40410    0.04610  -8.766  < 2e-16 ***
## zRefCohesion         -0.19226    0.04683  -4.105 4.04e-05 ***
## zDeepCohesion         0.35083    0.03074  11.413  < 2e-16 ***
## zSyntacticSimplicity -0.40807    0.05000  -8.161 3.33e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zDpChs
## zNarrativty  0.020                            
## zWrdCncrtns -0.036  0.392                     
## zRefCohesin -0.019 -0.588  0.050              
## zDeepCohesn  0.044  0.029 -0.236 -0.194       
## zSyntctcSmp -0.036 -0.101  0.617  0.579 -0.165

Models with Word Attack

M3 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
## Warning in checkConv(attr(opt, "derivs"), opt$par, ctrl =
## control$checkConv, : Model failed to converge with max|grad| = 0.00169195
## (tol = 0.001, component 1)
summary(M3)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zSyntacticSimplicity + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7753.5   7809.3  -3868.7   7737.5     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.1495 -0.5858  0.3232  0.5405  2.7809 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.083    1.04    
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                      Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           1.20593    0.08801  13.703  < 2e-16 ***
## zWordAttack           0.79417    0.08711   9.116  < 2e-16 ***
## zNarrativity          0.20897    0.04238   4.931 8.17e-07 ***
## zWordConcreteness    -0.40752    0.04629  -8.804  < 2e-16 ***
## zRefCohesion         -0.19395    0.04703  -4.124 3.72e-05 ***
## zDeepCohesion         0.35033    0.03087  11.349  < 2e-16 ***
## zSyntacticSimplicity -0.41471    0.05023  -8.256  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs zDpChs
## zWordAttack  0.043                                   
## zNarrativty  0.025  0.013                            
## zWrdCncrtns -0.046 -0.019  0.391                     
## zRefCohesin -0.024 -0.010 -0.589  0.051              
## zDeepCohesn  0.054  0.026  0.029 -0.237 -0.194       
## zSyntctcSmp -0.046 -0.018 -0.103  0.618  0.580 -0.166
## convergence code: 0
## Model failed to converge with max|grad| = 0.00169195 (tol = 0.001, component 1)
M4 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M4)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7820.8   7869.6  -3903.4   7806.8     7865 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.2015 -0.6077  0.3249  0.5431  2.9420 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.064    1.031   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                   Estimate Std. Error z value Pr(>|z|)    
## (Intercept)        1.18737    0.08720  13.617  < 2e-16 ***
## zWordAttack        0.78875    0.08635   9.135  < 2e-16 ***
## zNarrativity       0.17960    0.04201   4.275 1.91e-05 ***
## zWordConcreteness -0.17940    0.03707  -4.840 1.30e-06 ***
## zRefCohesion       0.03297    0.03874   0.851    0.395    
## zDeepCohesion      0.31334    0.02997  10.455  < 2e-16 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs
## zWordAttack  0.044                            
## zNarrativty  0.015  0.012                     
## zWrdCncrtns -0.022 -0.010  0.587              
## zRefCohesin  0.006  0.000 -0.653 -0.481       
## zDeepCohesn  0.043  0.024 -0.032 -0.160 -0.093

Note. Model 3 failed to converge ###Convergence checks

isSingular(M3)
## [1] FALSE
converge_ok(M3)
## Warning: 'converge_ok' is deprecated.
## Use 'performance::check_convergence()' instead.
## See help("Deprecated")
## [1] TRUE
## attr(,"gradient")
## [1] 3.031241e-05

I believe these are the results we want from the convergence test. Click below to read more about that https://www.rdocumentation.org/packages/lme4/versions/1.1-21/topics/isSingular

Arousal and Valence while controlling for Word attack

E1 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity +zArousal
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(E1)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zSyntacticSimplicity + zArousal +  
##     (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7724.8   7787.6  -3853.4   7706.8     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.7455 -0.5849  0.3230  0.5358  2.7809 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.093    1.045   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                      Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           1.21241    0.08842  13.712  < 2e-16 ***
## zWordAttack           0.79771    0.08750   9.116  < 2e-16 ***
## zNarrativity          0.24883    0.04346   5.725 1.03e-08 ***
## zWordConcreteness    -0.45278    0.04661  -9.714  < 2e-16 ***
## zRefCohesion         -0.08430    0.05072  -1.662   0.0965 .  
## zDeepCohesion         0.27060    0.03368   8.034 9.43e-16 ***
## zSyntacticSimplicity -0.33462    0.05151  -6.497 8.21e-11 ***
## zArousal              0.22928    0.04124   5.559 2.71e-08 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs zDpChs zSyntS
## zWordAttack  0.043                                          
## zNarrativty  0.032  0.015                                   
## zWrdCncrtns -0.048 -0.022  0.334                            
## zRefCohesin -0.013 -0.004 -0.476 -0.030                     
## zDeepCohesn  0.038  0.017 -0.036 -0.121 -0.315              
## zSyntctcSmp -0.037 -0.014 -0.065  0.529  0.617 -0.244       
## zArousal     0.027  0.015  0.177 -0.198  0.370 -0.411  0.248
E2 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
            +zArousal
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(E2)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zArousal + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7765.6   7821.4  -3874.8   7749.6     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.1039 -0.5884  0.3249  0.5408  2.7899 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.082    1.04    
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                   Estimate Std. Error z value Pr(>|z|)    
## (Intercept)        1.20004    0.08793  13.648  < 2e-16 ***
## zWordAttack        0.79468    0.08704   9.130  < 2e-16 ***
## zNarrativity       0.23308    0.04314   5.402 6.58e-08 ***
## zWordConcreteness -0.29713    0.03991  -7.446 9.63e-14 ***
## zRefCohesion       0.11996    0.04021   2.983  0.00286 ** 
## zDeepCohesion      0.22164    0.03218   6.887 5.69e-12 ***
## zArousal           0.29336    0.03901   7.520 5.47e-14 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs zDpChs
## zWordAttack  0.044                                   
## zNarrativty  0.025  0.014                            
## zWrdCncrtns -0.033 -0.017  0.451                     
## zRefCohesin  0.015  0.006 -0.564 -0.534              
## zDeepCohesn  0.028  0.015 -0.074  0.015 -0.194       
## zArousal     0.035  0.019  0.181 -0.395  0.282 -0.366
E3 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity +zValence
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(E3)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zSyntacticSimplicity + zValence +  
##     (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7746.5   7809.3  -3864.3   7728.5     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.2205 -0.5892  0.3220  0.5424  3.0376 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.087    1.043   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                      Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           1.20647    0.08817  13.684  < 2e-16 ***
## zWordAttack           0.79569    0.08727   9.117  < 2e-16 ***
## zNarrativity          0.16572    0.04462   3.714 0.000204 ***
## zWordConcreteness    -0.46817    0.05057  -9.257  < 2e-16 ***
## zRefCohesion         -0.19679    0.04692  -4.194 2.74e-05 ***
## zDeepCohesion         0.41974    0.03855  10.888  < 2e-16 ***
## zSyntacticSimplicity -0.55168    0.06799  -8.114 4.91e-16 ***
## zValence             -0.15872    0.05274  -3.010 0.002616 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs zDpChs zSyntS
## zWordAttack  0.043                                          
## zNarrativty  0.020  0.009                                   
## zWrdCncrtns -0.044 -0.022  0.474                            
## zRefCohesin -0.024 -0.011 -0.549  0.051                     
## zDeepCohesn  0.047  0.026 -0.173 -0.410 -0.168              
## zSyntctcSmp -0.038 -0.020  0.151  0.689  0.439 -0.496       
## zValence    -0.007 -0.010  0.323  0.403  0.022 -0.596  0.675
E4 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
            +zValence
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(E4)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zValence + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7811.1   7866.9  -3897.5   7795.1     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.3960 -0.5951  0.3282  0.5396  2.7402 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.066    1.033   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                   Estimate Std. Error z value Pr(>|z|)    
## (Intercept)        1.19099    0.08731  13.640  < 2e-16 ***
## zWordAttack        0.78908    0.08646   9.126  < 2e-16 ***
## zNarrativity       0.22103    0.04389   5.036 4.75e-07 ***
## zWordConcreteness -0.19008    0.03700  -5.137 2.79e-07 ***
## zRefCohesion      -0.02584    0.04224  -0.612 0.540602    
## zDeepCohesion      0.26343    0.03330   7.910 2.57e-15 ***
## zValence           0.13200    0.03854   3.424 0.000616 ***
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs zDpChs
## zWordAttack  0.043                                   
## zNarrativty  0.022  0.013                            
## zWrdCncrtns -0.024 -0.011  0.533                     
## zRefCohesin -0.003 -0.002 -0.686 -0.400              
## zDeepCohesn  0.031  0.019 -0.137 -0.109  0.096       
## zValence     0.020  0.006  0.280 -0.089 -0.407 -0.434
E5 = glmer(GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
            +zArousal + zValence
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(E5)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zWordAttack + zNarrativity + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zArousal + zValence + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7764.3   7827.1  -3873.2   7746.3     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.0286 -0.5866  0.3249  0.5432  2.7959 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.083    1.041   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                   Estimate Std. Error z value Pr(>|z|)    
## (Intercept)        1.20026    0.08798  13.642  < 2e-16 ***
## zWordAttack        0.79561    0.08709   9.136  < 2e-16 ***
## zNarrativity       0.21435    0.04431   4.837 1.32e-06 ***
## zWordConcreteness -0.31339    0.04097  -7.649 2.02e-14 ***
## zRefCohesion       0.17718    0.05096   3.477 0.000507 ***
## zDeepCohesion      0.24002    0.03364   7.135 9.70e-13 ***
## zArousal           0.34984    0.04959   7.054 1.74e-12 ***
## zValence          -0.09113    0.04976  -1.832 0.067019 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zWrdAt zNrrtv zWrdCn zRfChs zDpChs zArosl
## zWordAttack  0.044                                          
## zNarrativty  0.023  0.012                                   
## zWrdCncrtns -0.034 -0.018  0.480                            
## zRefCohesin  0.015  0.009 -0.576 -0.547                     
## zDeepCohesn  0.027  0.017 -0.143 -0.053  0.043              
## zArousal     0.031  0.020 -0.005 -0.438  0.554 -0.080       
## zValence    -0.005 -0.008  0.230  0.221 -0.613 -0.304 -0.622

Interactions with word attack and narrativity

M5 = glmer(GatesScore ~ zNarrativity*zWordAttack + zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M5)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity * zWordAttack + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zSyntacticSimplicity + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7752.4   7815.2  -3867.2   7734.4     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.4138 -0.5897  0.3234  0.5433  2.9071 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.082    1.04    
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)               1.21161    0.08808  13.756  < 2e-16 ***
## zNarrativity              0.22145    0.04295   5.156 2.52e-07 ***
## zWordAttack               0.80016    0.08719   9.178  < 2e-16 ***
## zWordConcreteness        -0.41277    0.04651  -8.874  < 2e-16 ***
## zRefCohesion             -0.19940    0.04725  -4.220 2.44e-05 ***
## zDeepCohesion             0.35221    0.03090  11.397  < 2e-16 ***
## zSyntacticSimplicity     -0.42200    0.05066  -8.330  < 2e-16 ***
## zNarrativity:zWordAttack  0.05266    0.02991   1.761   0.0783 .  
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdAt zWrdCn zRfChs zDpChs zSyntS
## zNarrativty  0.035                                          
## zWordAttack  0.046  0.024                                   
## zWrdCncrtns -0.049  0.369 -0.023                            
## zRefCohesin -0.027 -0.591 -0.014  0.059                     
## zDeepCohesn  0.056  0.038  0.028 -0.242 -0.201              
## zSyntctcSmp -0.050 -0.117 -0.023  0.620  0.586 -0.177       
## zNrrtvty:WA  0.040  0.164  0.046 -0.069 -0.068  0.039 -0.085
M5a = glmer(GatesScore ~ zWordAttack*zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)

M6 = glmer(GatesScore ~ zNarrativity*zWordAttack + zWordConcreteness + zRefCohesion + zDeepCohesion
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M6)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity * zWordAttack + zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7821.2   7877.0  -3902.6   7805.2     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.3167 -0.6124  0.3236  0.5437  2.8731 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.063    1.031   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)               1.19096    0.08725  13.651  < 2e-16 ***
## zNarrativity              0.18761    0.04247   4.418 9.98e-06 ***
## zWordAttack               0.79243    0.08639   9.172  < 2e-16 ***
## zWordConcreteness        -0.18065    0.03714  -4.864 1.15e-06 ***
## zRefCohesion              0.03256    0.03871   0.841     0.40    
## zDeepCohesion             0.31282    0.02995  10.445  < 2e-16 ***
## zNarrativity:zWordAttack  0.03704    0.02958   1.252     0.21    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdAt zWrdCn zRfChs zDpChs
## zNarrativty  0.023                                   
## zWordAttack  0.045  0.020                            
## zWrdCncrtns -0.024  0.573 -0.011                     
## zRefCohesin  0.006 -0.648 -0.001 -0.481              
## zDeepCohesn  0.042 -0.033  0.023 -0.158 -0.093       
## zNrrtvty:WA  0.035  0.148  0.038 -0.030 -0.009 -0.012
plot(effect("zNarrativity:zWordAttack", M5), multiline=TRUE)

plot(effect("zWordAttack:zNarrativity", M5a), multiline=TRUE)

Interactions with word attack and Word concreteness

M7 = glmer(GatesScore ~ zNarrativity+ zWordAttack*zWordConcreteness + zRefCohesion + zDeepCohesion
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M7)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordAttack * zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + zSyntacticSimplicity + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7754.1   7816.8  -3868.0   7736.1     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.1920 -0.5860  0.3231  0.5415  2.9172 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.082    1.04    
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                               Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                    1.20842    0.08804  13.726  < 2e-16 ***
## zNarrativity                   0.21075    0.04239   4.972 6.64e-07 ***
## zWordAttack                    0.79688    0.08715   9.144  < 2e-16 ***
## zWordConcreteness             -0.41510    0.04662  -8.904  < 2e-16 ***
## zRefCohesion                  -0.19551    0.04705  -4.156 3.24e-05 ***
## zDeepCohesion                  0.35110    0.03091  11.359  < 2e-16 ***
## zSyntacticSimplicity          -0.41720    0.05041  -8.277  < 2e-16 ***
## zWordAttack:zWordConcreteness -0.03493    0.02925  -1.194    0.232    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdAt zWrdCn zRfChs zDpChs zSyntS
## zNarrativty  0.026                                          
## zWordAttack  0.044  0.014                                   
## zWrdCncrtns -0.051  0.380 -0.025                            
## zRefCohesin -0.025 -0.588 -0.011  0.054                     
## zDeepCohesn  0.055  0.031  0.026 -0.238 -0.197              
## zSyntctcSmp -0.047 -0.105 -0.020  0.615  0.582 -0.171       
## zWrdAttc:WC -0.025 -0.037 -0.030  0.133  0.026 -0.022  0.040
M8 = glmer(GatesScore ~ zNarrativity + zWordAttack*zWordConcreteness + zRefCohesion + zDeepCohesion
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M8)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordAttack * zWordConcreteness +  
##     zRefCohesion + zDeepCohesion + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7821.8   7877.5  -3902.9   7805.8     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.3311 -0.6146  0.3242  0.5438  2.9254 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.063    1.031   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                               Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                    1.18939    0.08722  13.636  < 2e-16 ***
## zNarrativity                   0.18064    0.04200   4.301 1.70e-05 ***
## zWordAttack                    0.79085    0.08637   9.156  < 2e-16 ***
## zWordConcreteness             -0.18625    0.03767  -4.945 7.63e-07 ***
## zRefCohesion                   0.03289    0.03868   0.850    0.395    
## zDeepCohesion                  0.31302    0.02998  10.439  < 2e-16 ***
## zWordAttack:zWordConcreteness -0.02983    0.02967  -1.005    0.315    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdAt zWrdCn zRfChs zDpChs
## zNarrativty  0.016                                   
## zWordAttack  0.045  0.013                            
## zWrdCncrtns -0.029  0.570 -0.017                     
## zRefCohesin  0.006 -0.652  0.000 -0.474              
## zDeepCohesn  0.042 -0.032  0.024 -0.154 -0.094       
## zWrdAttc:WC -0.025 -0.026 -0.028  0.178  0.001  0.011

Interaction with Word attack and cohesions

M9 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion*zWordAttack + zDeepCohesion
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M9)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion *  
##     zWordAttack + zDeepCohesion + zSyntacticSimplicity + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7754.2   7816.9  -3868.1   7736.2     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.1325 -0.5802  0.3225  0.5391  2.8020 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.083    1.041   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)               1.20438    0.08804  13.680  < 2e-16 ***
## zNarrativity              0.20991    0.04236   4.955 7.22e-07 ***
## zWordConcreteness        -0.40561    0.04623  -8.773  < 2e-16 ***
## zRefCohesion             -0.19975    0.04710  -4.241 2.23e-05 ***
## zWordAttack               0.79289    0.08715   9.098  < 2e-16 ***
## zDeepCohesion             0.34894    0.03083  11.317  < 2e-16 ***
## zSyntacticSimplicity     -0.41378    0.05016  -8.249  < 2e-16 ***
## zRefCohesion:zWordAttack -0.03311    0.02879  -1.150     0.25    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zWrdAt zDpChs zSyntS
## zNarrativty  0.025                                          
## zWrdCncrtns -0.046  0.392                                   
## zRefCohesin -0.025 -0.586  0.046                            
## zWordAttack  0.043  0.013 -0.019 -0.011                     
## zDeepCohesn  0.055  0.030 -0.237 -0.192  0.026              
## zSyntctcSmp -0.046 -0.101  0.617  0.574 -0.018 -0.167       
## zRfChsn:zWA  0.013 -0.017 -0.035  0.100  0.008  0.036 -0.017
M10 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion*zWordAttack + zDeepCohesion
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M10)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion *  
##     zWordAttack + zDeepCohesion + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7821.3   7877.1  -3902.7   7805.3     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.1876 -0.6028  0.3237  0.5470  2.9704 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.064    1.032   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                          Estimate Std. Error z value Pr(>|z|)    
## (Intercept)               1.18578    0.08723  13.594  < 2e-16 ***
## zNarrativity              0.18095    0.04200   4.308 1.64e-05 ***
## zWordConcreteness        -0.17821    0.03704  -4.812 1.50e-06 ***
## zRefCohesion              0.02533    0.03911   0.648    0.517    
## zWordAttack               0.78741    0.08638   9.116  < 2e-16 ***
## zDeepCohesion             0.31193    0.02993  10.421  < 2e-16 ***
## zRefCohesion:zWordAttack -0.03488    0.02902  -1.202    0.229    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zWrdAt zDpChs
## zNarrativty  0.015                                   
## zWrdCncrtns -0.023  0.587                            
## zRefCohesin  0.006 -0.647 -0.480                     
## zWordAttack  0.043  0.012 -0.010 -0.001              
## zDeepCohesn  0.043 -0.032 -0.160 -0.091  0.024       
## zRfChsn:zWA  0.012 -0.024 -0.025  0.153  0.008  0.035
M11 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion*zWordAttack
           + zSyntacticSimplicity
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M11)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion * zWordAttack + zSyntacticSimplicity + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7753.3   7816.0  -3867.6   7735.3     7863 
## 
## Scaled residuals: 
##    Min     1Q Median     3Q    Max 
## -6.220 -0.585  0.322  0.542  2.724 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.082    1.04    
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                           Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                1.21075    0.08807  13.748  < 2e-16 ***
## zNarrativity               0.20735    0.04251   4.878 1.07e-06 ***
## zWordConcreteness         -0.41260    0.04651  -8.872  < 2e-16 ***
## zRefCohesion              -0.19368    0.04722  -4.101 4.11e-05 ***
## zDeepCohesion              0.36065    0.03163  11.401  < 2e-16 ***
## zWordAttack                0.79928    0.08718   9.168  < 2e-16 ***
## zSyntacticSimplicity      -0.41940    0.05032  -8.334  < 2e-16 ***
## zDeepCohesion:zWordAttack  0.04489    0.02982   1.505    0.132    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zDpChs zWrdAt zSyntS
## zNarrativty  0.023                                          
## zWrdCncrtns -0.049  0.390                                   
## zRefCohesin -0.024 -0.592  0.051                            
## zDeepCohesn  0.066  0.016 -0.255 -0.181                     
## zWordAttack  0.046  0.011 -0.023 -0.010  0.038              
## zSyntctcSmp -0.049 -0.106  0.620  0.579 -0.179 -0.022       
## zDpChsn:zWA  0.039 -0.028 -0.077  0.007  0.216  0.045 -0.064
M12 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion*zWordAttack
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M12)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion * zWordAttack + (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7821.9   7877.6  -3902.9   7805.9     7864 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -5.3030 -0.6115  0.3238  0.5472  2.8883 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.063    1.031   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                           Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                1.19009    0.08724  13.641  < 2e-16 ***
## zNarrativity               0.17712    0.04215   4.202 2.65e-05 ***
## zWordConcreteness         -0.18048    0.03711  -4.863 1.15e-06 ***
## zRefCohesion               0.03563    0.03892   0.915    0.360    
## zDeepCohesion              0.31902    0.03053  10.449  < 2e-16 ***
## zWordAttack                0.79153    0.08639   9.162  < 2e-16 ***
## zDeepCohesion:zWordAttack  0.02832    0.02960   0.957    0.339    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zDpChs zWrdAt
## zNarrativty  0.013                                   
## zWrdCncrtns -0.024  0.589                            
## zRefCohesin  0.009 -0.656 -0.483                     
## zDeepCohesn  0.051 -0.049 -0.167 -0.071              
## zWordAttack  0.045  0.009 -0.011  0.003  0.033       
## zDpChsn:zWA  0.034 -0.063 -0.034  0.075  0.191  0.037

Interaction with Word attack and syntactic simplicity

M13 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion + zSyntacticSimplicity*zWordAttack
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M13)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion + zSyntacticSimplicity * zWordAttack + (1 |      ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7753.7   7816.5  -3867.9   7735.7     7863 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.1121 -0.5843  0.3228  0.5423  2.9361 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.083    1.041   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                                  Estimate Std. Error z value Pr(>|z|)    
## (Intercept)                       1.20482    0.08803  13.686  < 2e-16 ***
## zNarrativity                      0.20826    0.04235   4.918 8.74e-07 ***
## zWordConcreteness                -0.40548    0.04620  -8.776  < 2e-16 ***
## zRefCohesion                     -0.19218    0.04700  -4.089 4.33e-05 ***
## zDeepCohesion                     0.34816    0.03086  11.284  < 2e-16 ***
## zSyntacticSimplicity             -0.40582    0.05066  -8.011 1.14e-15 ***
## zWordAttack                       0.79329    0.08715   9.103  < 2e-16 ***
## zSyntacticSimplicity:zWordAttack  0.03855    0.02904   1.328    0.184    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zDpChs zSyntS zWrdAt
## zNarrativty  0.025                                          
## zWrdCncrtns -0.046  0.391                                   
## zRefCohesin -0.024 -0.586  0.049                            
## zDeepCohesn  0.054  0.028 -0.238 -0.197                     
## zSyntctcSmp -0.044 -0.103  0.613  0.579 -0.175              
## zWordAttack  0.043  0.013 -0.019 -0.010  0.025 -0.016       
## zSyntctS:WA -0.007 -0.012  0.031  0.030 -0.052  0.129 -0.003

Interaction with Word attack and emotion

M14 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion + zSyntacticSimplicity + zWordAttack*zArousal
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
summary(M14)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion + zSyntacticSimplicity + zWordAttack * zArousal +  
##     (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7719.7   7789.4  -3849.8   7699.7     7862 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -7.1396 -0.5753  0.3214  0.5365  2.7076 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.093    1.046   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                      Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           1.21613    0.08848  13.745  < 2e-16 ***
## zNarrativity          0.25220    0.04359   5.786 7.22e-09 ***
## zWordConcreteness    -0.45340    0.04662  -9.725  < 2e-16 ***
## zRefCohesion         -0.08327    0.05066  -1.644  0.10021    
## zDeepCohesion         0.26875    0.03372   7.971 1.57e-15 ***
## zSyntacticSimplicity -0.33512    0.05117  -6.549 5.80e-11 ***
## zWordAttack           0.80255    0.08758   9.163  < 2e-16 ***
## zArousal              0.24757    0.04192   5.906 3.50e-09 ***
## zWordAttack:zArousal  0.07871    0.02908   2.707  0.00679 ** 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zDpChs zSyntS zWrdAt zArosl
## zNarrativty  0.032                                                 
## zWrdCncrtns -0.049  0.333                                          
## zRefCohesin -0.013 -0.479 -0.031                                   
## zDeepCohesn  0.038 -0.035 -0.118 -0.312                            
## zSyntctcSmp -0.038 -0.070  0.532  0.614 -0.240                     
## zWordAttack  0.044  0.016 -0.022 -0.004  0.016 -0.014              
## zArousal     0.035  0.177 -0.203  0.364 -0.414  0.237  0.025       
## zWrdAttck:A  0.021  0.031 -0.012  0.008 -0.020 -0.006  0.030  0.160
M15 = glmer(GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion + zDeepCohesion + zSyntacticSimplicity + zWordAttack*zValence
           + (1|ID),data = Corrected_EmotionPaper_Data_Quartiles, family = binomial)
## Warning in checkConv(attr(opt, "derivs"), opt$par, ctrl =
## control$checkConv, : Model failed to converge with max|grad| = 0.00393562
## (tol = 0.001, component 1)
summary(M15)
## Generalized linear mixed model fit by maximum likelihood (Laplace
##   Approximation) [glmerMod]
##  Family: binomial  ( logit )
## Formula: GatesScore ~ zNarrativity + zWordConcreteness + zRefCohesion +  
##     zDeepCohesion + zSyntacticSimplicity + zWordAttack * zValence +  
##     (1 | ID)
##    Data: Corrected_EmotionPaper_Data_Quartiles
## 
##      AIC      BIC   logLik deviance df.resid 
##   7746.9   7816.6  -3863.4   7726.9     7862 
## 
## Scaled residuals: 
##     Min      1Q  Median      3Q     Max 
## -6.2902 -0.5937  0.3231  0.5398  3.1096 
## 
## Random effects:
##  Groups Name        Variance Std.Dev.
##  ID     (Intercept) 1.087    1.042   
## Number of obs: 7872, groups:  ID, 164
## 
## Fixed effects:
##                      Estimate Std. Error z value Pr(>|z|)    
## (Intercept)           1.20949    0.08820  13.713  < 2e-16 ***
## zNarrativity          0.16710    0.04472   3.737 0.000186 ***
## zWordConcreteness    -0.47242    0.05075  -9.309  < 2e-16 ***
## zRefCohesion         -0.19847    0.04706  -4.217 2.47e-05 ***
## zDeepCohesion         0.42400    0.03882  10.921  < 2e-16 ***
## zSyntacticSimplicity -0.55647    0.06806  -8.176 2.94e-16 ***
## zWordAttack           0.79903    0.08731   9.152  < 2e-16 ***
## zValence             -0.15327    0.05298  -2.893 0.003815 ** 
## zWordAttack:zValence  0.03864    0.02973   1.300 0.193701    
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 
## Correlation of Fixed Effects:
##             (Intr) zNrrtv zWrdCn zRfChs zDpChs zSyntS zWrdAt zValnc
## zNarrativty  0.021                                                 
## zWrdCncrtns -0.046  0.468                                          
## zRefCohesin -0.024 -0.552  0.055                                   
## zDeepCohesn  0.050 -0.170 -0.416 -0.166                            
## zSyntctcSmp -0.040  0.145  0.691  0.441 -0.499                     
## zWordAttack  0.045  0.010 -0.024 -0.012  0.030 -0.022              
## zValence    -0.003  0.322  0.395  0.020 -0.587  0.667 -0.006       
## zWrdAttck:V  0.027  0.025 -0.065 -0.026  0.085 -0.053  0.034  0.077
## convergence code: 0
## Model failed to converge with max|grad| = 0.00393562 (tol = 0.001, component 1)
plot(effect("zWordAttack:zArousal", M14), multiline=TRUE)