## Loading required package: Matrix
## Loading required package: lme4
## KernSmooth 2.23 loaded
## Copyright M. P. Wand 1997-2009
##
## Attaching package: 'lmerTest'
##
## The following object is masked from 'package:lme4':
##
## lmer
##
## The following object is masked from 'package:stats':
##
## step
##
## Loading required package: ggplot2
##
## Attaching package: 'ggplot2'
##
## The following object is masked from 'package:lme4':
##
## fortify
Trails A Coefficient Plot
mm1 = lmer(TrailsAtestSec ~ Age + IPVstatus + Sex + Race + (1 | HNDid) + Age:Race +
IPVstatus:Sex, data = IPVandCognitionDataSet2)
coefplot(mm1)
Trails A Interaction Plot for Race and Age
interaction.plot(IPVandCognitionDataSet2$Age, IPVandCognitionDataSet2$Race,
IPVandCognitionDataSet2$TrailsAtestSec)
Trails A (with CES) Coefficient Plot
mm1 = lmer(TrailsAtestSec ~ Age + Race + (Age | HNDid) + Age:Race, data = IPVandCognitionDataSet2)
## Warning: number of observations <= rank(Z); variance-covariance matrix
## will be unidentifiable
library(coefplot)
coefplot(mm1)
Trails A (with CES) Interaction Plot for Race and Age
interaction.plot(IPVandCognitionDataSet2$Age, IPVandCognitionDataSet2$Race,
IPVandCognitionDataSet2$TrailsAtestSec)
Word Fluency (with CES) Coefficient Plot
mm1 = lmer(FluencyWord ~ Age + IPVstatus + Sex + Race + CES1 + (1 | subclass) +
(1 | HNDid) + Age:Sex + Age:Race + Age:CES1 + IPVstatus:Race + IPVstatus:CES1 +
Sex:Race + Sex:CES1 + Race:CES1 + Age:Sex:Race + Age:Sex:CES1 + Age:Race:CES1 +
IPVstatus:Race:CES1 + Sex:Race:CES1 + Age:Sex:Race:CES1, data = IPVandCognitionDataSet2)
library(coefplot)
coefplot(mm1)