search for: augframe

Displaying 5 results from an estimated 5 matches for "augframe".

Did you mean: airframe
2005 Mar 26
1
lme: random effects of a quadratic term
Hello, I am estimating the following model: so2.lme<-lme(so2~1+I(alcadakm^2)+dia,data=subjectes2,na.action=na.omit) And when I try to plot the random effects of the quadratic term with respect to a covariate (mam) I get an error: > so2.lmeRE<-ranef(so2.lme,augFrame=T) > plot(so2.lmeRE,form=I(alcadakm^2)~mam) Error in plot.ranef.lme(so2.lmeRE, form = I(alcadakm^2) ~ mam ) : Only single effects allowed in left side of form. Any suggestion? Thanks! Montse Rue
2003 May 12
1
plot.ranef.lme (PR#2986)
...) data(Phenobarb) na.include <- function(x)x phe1 <- nlme(conc~phenoModel(Subject, time, dose, lCl, lV), data = Phenobarb, fixed = lCl+lV~1, random= pdDiag(lCl+lV~1), start = c(-5,0), na.action = na.include, naPattern = ~!is.na(conc)) phe.ranef <- ranef(phe1,augFrame=TRUE) plot(phe.ranef, form=lCl~Wt+ApgarInd) [Error in max(length(x0), length(x1), length(y0), length(y1)) : Argument "x0" is missing, with no default] The cause is plain to see: in plot.ranef.lme we have staple.ends <- list(x1 = c(rep(X - w, 2), rep(X +...
2009 May 04
1
how to change nlme() contrast parametrization?
...====================================== library(nlme) Soybean[1:3, ] (fm1Soy.lis <- nlsList(weight ~ SSlogis(Time, Asym, xmid, scal),                        data = Soybean)) (fm1Soy.nlme <- nlme(fm1Soy.lis)) fm2Soy.nlme <- update(fm1Soy.nlme, weights = varPower()) plot(ranef(fm2Soy.nlme, augFrame = TRUE),      form = ~ Year * Variety, layout = c(3,1)) soyFix <- fixef(fm2Soy.nlme) options(contrasts = c("contr.treatment", "contr.poly")) (fm3Soy.nlme <-  update(fm2Soy.nlme,         fixed = Asym + xmid + scal ~ Year,         start = c(soyFix[1], 0, 0, soyFix[2], 0, 0...
2006 Aug 03
2
NLME: Problem with plotting ranef vs a factor
...a=Data1_93) detach(Data) Here is the code to check that the covariate called pcat is indeed a factor: > levels(pcat) [1] "1" "2" "3" > is.factor(pcat) [1] TRUE and then after the model is fitted I extract the random effects: D1C2.ran <- ranef(mod11.103nlme,augFrame=T) and here is an extract from the object: C R day gamedens pcat site mutcat1 pdens0 log2game NA02_259 -1.016987007 0.0162825099 15.75000 23.50000 1 Namaacha Mixed 15018 3.761099 NA02_073 -0.939355374 0.0132589702 10.50000 23.7500...
2004 Sep 21
0
Lme warning with coef()
Hello< I routinely use the following without a problem: fm1<-lme(score~time,data,random=~time|ID) tmp<-coef(fm1, augFrame=T) However, in my current situation, I am running into the following error when I execute the coef() call Error in tapply(as.character(object[[nm]]), groups, FUN[[dClass]]) : arguments must have same length There are some cases with missing data, but I believe this was true in prior suc...