## shows many methds you should consider *before* getME():
showMethods(class = "mer")
(fm1 <- lmer(Reaction ~ Days + (Days|Subject), sleepstudy))
gm1 <- glmer(cbind(incidence, size - incidence) ~ period + (1 | herd),
data = cbpp, family = binomial)
nm1 <- nlmer(circumference ~ SSlogis(age, Asym, xmid, scal) ~ Asym|Tree,
Orange, start = c(Asym = 200, xmid = 725, scal = 350))
Z <- getME(fm1, "Z")
stopifnot(is(Z, "CsparseMatrix"),
c(180,36) == dim(Z),
all.equal(fixef(fm1), getME(fm1, "beta"),
check.attr=FALSE, tol = 0))
## All that can be accessed [potentially ..]:
(nmME <- eval(formals(getME)$name))
## internal consistency check ensuring that all work:
## "try(.)" because some are not yet implemented:
str(fm.parts <- sapply(nmME, function(nm) try(getME(fm1, nm)),
simplify=FALSE))
str(gm.parts <- sapply(nmME, function(nm) try(getME(gm1, nm)),
simplify=FALSE))
str(nm.parts <- sapply(nmME, function(nm) try(getME(nm1, nm)),
simplify=FALSE))
isLMM(fm1)
isGLMM(gm1)
## check all :
is.MM <- function(x) c(LMM = isLMM(x), GLMM= isGLMM(x), NLMM= isNLMM(x))
stopifnot(cbind(is.MM(fm1), is.MM(gm1), is.MM(nm1))
== diag(rep(TRUE,3)))
Run the code above in your browser using DataLab