Displaying 2 results from an estimated 2 matches for "mer_coef".
2006 Mar 16
1
lme4/Matrix: Call to .Call("mer_update_y"...) and LMEoptimize gives unexpected side effect...
...e <- function(x, value)
{
if (value$msMaxIter < 1) return(x)
nc <- x at nc
constr <- unlist(lapply(nc, function(k) 1:((k*(k+1))/2) <= k))
fn <- function(pars)
deviance(.Call("mer_coefGets", x, pars, 2, PACKAGE = "Matrix"))
gr <- if (value$gradient)
function(pars) {
if (!isTRUE(all.equal(pars,
.Call("mer_coef", x,...
2007 Jan 26
0
R crash with modified lmer code
...t;))
mer at devComp[8] <- -1
mer at status["glmm"] <- as.integer(switch(method, PQL = 1,
Laplace = 2, AGQ = 3))
GSpt <- .Call(glmer_init, environment(), fltype)
if (cv$usePQL) {
.Call(glmer_PQL, GSpt)
PQLpars <- c(fixef(mer), .Call(mer_coef, mer, 2))
}
else {
PQLpars <- c(coef(glmFit), .Call(mer_coef, mer, 2))
}
if (method == "PQL") {
.Call(glmer_devLaplace, PQLpars, GSpt)
.Call(glmer_finalize, GSpt)
return(new("glmer", new("lmer", mer, frame = if (model)...