similar to: standardized residuals (random effects) using nlme and ranef

Displaying 20 results from an estimated 5000 matches similar to: "standardized residuals (random effects) using nlme and ranef"

2006 Jul 24
3
standardized random effects with ranef.lme()
Using ranef() (package nlme, version 3.1-75) with an 'lme' object I can obtain random effects for intercept and slope of a certain level (say: 1) - this corresponds to (say level 1) "residuals" in MLWin. Maybe I'm mistaken here, but the results are identical. However, if I try to get the standardized random effects adding the paramter "standard=T" to the
2002 Apr 08
1
Error in nlme ranef plot()
Dear R list members; I have a 10 x 423 data frame which consisting of response, time, subject, site, plot and covariates (continueous and categorical) measured at the plot level. When the data frame was converted into a groupedData object, a warning appeared > A <- groupedData(ht ~ time | Subject, data = tt, outer = ~ site * plot, + labels=list(y = "Height", x =
2009 Feb 02
0
emperical bayes estimates and standard error lme4
Dear all, I am trying to get the emperical bayes estimates together with their standard errors out of lme4. Up to now I have used MLwiN to get these estimates. I have fitted the following - very simple - model, just to find out how this works. test<-lmer(y~(1|subject),data,REML=F) ranef(test,postVar=T) str(ranef(test,postVar=T) If I use the formulation of the emperical bayes estimates and
2006 Aug 03
2
NLME: Problem with plotting ranef vs a factor
Hi I am following the model building strategy that is outlined in the Pinheiro and Bates book wrt including covariates but am having a problem with the plot. Basically I am using 4 covariates (1 of them is continuous) and 3 of them are fine but the 4th one is being shown as a scatterplot despite the fact that it is a factor. I have explicitly declared this to be a factor (pcat<-as.factor(pcat))
2003 May 12
1
plot.ranef.lme (PR#2986)
library(nlme) 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),
2011 Feb 19
0
lmer, MCMCsamp and ranef samples?
I really hope sombody could help me with the following, I'm having problems accessing the random effect samples following the example on MCMCsamp: (fm1 <- lmer(Reaction ~ Days + (1|Subject) + (0+Days|Subject), sleepstudy)) set.seed(101); samp0 <- mcmcsamp(fm1, n = 1000, saveb=TRUE) str(samp0) Formal class 'merMCMC' [package "lme4"] with 9 slots ..@ Gp :
2011 Nov 03
0
Help in ranef Function
Hi I'm getting the intercepts of the Random effects as 0. Please help me to understand why this is coming Zero This is my R code Data<- read.csv("C:/FE and RE.csv") Formula="Y~X2+X3+X4 + (1|State) + (0+X5|State)" fit=lmer(formula=Formula,data=Data) ranef(fit). My sample Data State Year Y X2 X3 X4 X5 X6 S2 1960 27.8 397.5 42.2 50.7 78.3 65.8 S1 1960 29.9 413.3 38.1
2011 Aug 10
1
studentized and standarized residuals
Hi, I must be doing something silly here, because I can't get the studentised and standardised residuals from r output of a linear model to agree with what I think they should be from equation form. Thanks in advance, Jennifer x = seq(1,10) y = x + rnorm(10) mod = lm(y~x) rstandard(mod) residuals(mod)/(summary(mod)$sigma) rstudent(mod)
2004 Apr 27
0
Extracting labels for residuals from lme
Dear R-helpers, I want to try to extract residuals from a multi-level linear mixed effects model, to correlate with another variable. I need to know which residuals relate to which experimental units in the lme. I can show the labels that relate to the experimental units via the command ranef(fit0)$resid which gives: 604/1/0 -1.276971e-05 604/1/1 -1.078644e-03 606/1/0 -7.391706e-03 606/1/1
2007 Oct 08
0
Residuals for binomial lmer fits
Dear all, I would like to use the residuals in a general linear mixed effect model to diagnose model fit. I know that the resid function has been implemented for linear mixed models but not yet for general linear mixed effects. Is there a way to get them out of lmer fit objects? I tried searching the r-help archive and found nothing. I tried and failed to replicate what (I guessed would be
2007 Sep 19
1
SEM - standardized path coefficients?
Dear list members, In sem, std.coef() will give me standardized coefficients from a sem model. But is there a trick so that path.diagram can use these coefficients rather than unstandardized ones? Thanks Steve Powell From: John Fox <jfox_at_mcmaster.ca> Date: Wed 28 Feb 2007 - 14:37:22 GMT Dear Tim, See ?standardized.coefficients (after loading the sem package). Regards, John John
2007 Sep 26
1
Accessing the fixed- and random-effects variance-covariance matrices of an nlme model
I would appreciate confirmation that the function vcov(model.nlme) gives the var-cov matrix of the fixed effects in an nlme model. Presumably the random-effects var-cov matrix is given by cov(ranef (model.nlme)? Rob Forsyth
2007 Feb 28
1
SEM - standardized path coefficients?
Hello - Does anybody know how to get the SEM package in R to return standardized path coefficients instead of unstandardized ones? Does this involve changing the covariance matrix, or is there an argument in the SEM itself that can be changed? Thank you, Tim [[alternative HTML version deleted]]
2012 Nov 21
1
Regression: standardized coefficients & CI
I run 9 WLS regressions in R, with 7 predictors each. What I want to do now is compare: (1) The strength of predictors within each model (assuming all predictors are significant). That is, I want to say whether x1 is stronger than x2, and also say whether it is significantly stronger. I compare strength by simply comparing standardized beta weights, correct? How do I compare if one predictor is
2004 Sep 12
1
Discrepency between R and MlwiN
When playing around fitting unconditional growth models using R and MlwiN today, I produced two different sets of estimates that I can't reconcile and wondered if anyone here has an idea: The data is two-level repeated measures data with measures nested within child. There are two measures per child. I've fit an unconditional growth model as in Singer and Willet (2003) that allows for
2003 Jul 08
2
NLME Fitted Values
Dear List: I am having difficulties with the fitted values at different levels of a multilevel model. My data set is a series of student test scores over time with a total of 7,280 observations, 1,720 students nested witin 60 schools. The data set is not balanced. The model was fit using eg.model.1<-lme(math~year, random=~year|schoolid/childid, data=single). When I call the random
2006 Aug 22
1
Total (un)standardized effects in SEM?
Hi there, as a student sociology, I'm starting to learn about SEM. The course I follow is based on LISREL, but I want to use the SEM-package on R parallel to it. Using LISREL, I found it to be very usable to be able to see the total direct and total indirect effects (standardized and unstandardized) in the output. Can I create these effects using R? I know how to calculate them
2004 Jan 28
1
build fails to build help for nlme
Hi all, I'm trying to build from source on Linux and getting the following error when it tries to build the help for 'nlme': <snip> ranef.lme text html latex example reStruct text html latex example /home/sfalcon/sw/R-related/R-1.8.1/bin/INSTALL: line 1: 8133 Segmentation fault ${R_CMD} perl
2006 Dec 10
0
lmer, gamma family, log link: interpreting random effects
Dear all, I'm curious about how to interpret the results of the following code. The first model is directly from the help page of lmer; the second is the same model but using the Gamma family with log link. The fixed effects make sense, because y = 251.40510 + 10.46729 * Days is about the same as log(y) = 5.53613298 + 0.03502057 * Days but the random effects seem quite
2009 May 04
1
how to change nlme() contrast parametrization?
How to set the nlme() function to return the answer without the intercept 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,