similar to: nlme fixed effects specification

Displaying 20 results from an estimated 9000 matches similar to: "nlme fixed effects specification"

2006 Aug 03
2
fitting a model with the nlme package
Dear all, I am analyzing some data that requires a mixed model. I have been reading Pinheiro and Bates' book, but cannot find the notation to fit the following model: Suppose I have the dataset below. Here I am fitting variable p as a fixed effect, variable h as a random effect and variable t as nested within h. I would like to include the variable j as well as an independent (non-nested)
2005 Sep 01
2
VarCorr function for assigning random effects: was Question
If you are indeed using lme and not lmer then the needed function is VarCorr(). However, 2 recommendations. First, this is a busy list and better emails subject headers get better attention. Second, I would recommend using lmer as it is much faster. However, VarCorr seems to be incompatible with lmer and I do not know of another function to work with lmer. Hence, a better email subject header
2005 Sep 19
1
How to mimic pdMat of lme under lmer?
Dear members, I would like to switch from nlme to lme4 and try to translate some of my models that worked fine with lme. I have problems with the pdMat classes. Below a toy dataset with a fixed effect F and a random effect R. I gave also 2 similar lme models. The one containing pdLogChol (lme1) is easy to translate (as it is an explicit notation of the default model) The more parsimonious
2005 Dec 12
2
convergence error (lme) which depends on the version of nlme (?)
Dear list members, the following hlm was constructed: hlm <- groupedData(laut ~ design | grpzugeh, data = imp.not.I) the grouped data object is located at and can be downloaded: www.anicca-vijja.de/lg/hlm_example.Rdata The following works: library(nlme) summary( fitlme <- lme(hlm) ) with output: ... AIC BIC logLik 425.3768 465.6087 -197.6884 Random effects:
2006 Jul 28
3
random effects with lmer() and lme(), three random factors
Hi, all, I have a question about random effects model. I am dealing with a three-factor experiment dataset. The response variable y is modeled against three factors: Samples, Operators, and Runs. The experimental design is as follow: 4 samples were randomly chosen from a large pool of test samples. Each of the 4 samples was analyzed by 4 operators, randomly selected from a group of
2006 May 17
1
nlme model specification
Hi folks, I am tearing my hair out on this one. I am using an example from Pinheiro and Bates. ### this works data(Orange) mod.lis <- nlsList(circumference ~ SSlogis(age, Asymp, xmid, scal), data=Orange ) ### This works mod <- nlme(circumference ~ SSlogis(age, Asymp, xmid, scal), data=Orange, fixed = Asymp + xmid + scal ~ 1, start =
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
2009 Sep 01
1
Syntax for crossed random effects in nlme
Hello R users, I've read the posts on this topic, and had a look at the R documentation for nlme, but I can't seem to make this work. I'd like to be able to fit a mixed effects model with crossed random effects, but also be able to specify the covariance matrix structure for the residuals. Here's the syntax using the lmer function in lme4 (which doesn't currently allow
2009 May 11
1
Error in NLME (nonlinear mixed effects model)
Hi there, I have been trying to fit an NLME to my data. My dataset has two category levels - one is a fixed effect (level1) and one is a random effect (level2), though so far I have only experimented with the highest level grouping (fixed, level1), with the following code: mod1 <- nlme(H ~ a*(1-exp(-b*D^c)), data=sizes, fixed=a+b+c~factor(Loc), start=c(a=75,b=0.05,c=0.7)) This returns the
2024 Jan 08
1
how to specify uncorrelated random effects in nlme::lme()
Dear professor, I'm using package nlme, but I can't find a way to specify two uncorrelated random effects. For example, a random intercept and a random slope. In package lme4, we can specify&nbsp;x + (x ll g) to realize, but how in nlme? Thanks! ???????????????????????? Zhen Wang Graduate student, Department of Medical Statistics, School of Public Health, Sun Yat-sen
2012 Jul 25
2
Package 'nlme' linear mixed effects model error "unexpected symbol"
I am trying the following code with the 'nlme' package: 2007model<lme(Rank~Age*Mass+method='ML',random=~1|ID,na.action=na.exclude) I've also tried all kinds of variations of the above that I could think of. It gives me the error "unexpected symbol in '2007model' ". I'm not sure if this 'unexpected symbol' refers to the code I enter or the
2001 May 16
2
nlme and "Mixed- Effects Models..." in Windows
(windows 98, R 1.2.3, ESS 5.1.18, nlme 3.1 from CRAN) Dear R users, I am trying to follow Pinheiro and Bates book ("Mixed-Effects Models in S and S-PLUS"). I downloaded the nlme package from CRAN, and unzipped all the data and help files. Unfortunately, I cannot generate the figures in the book. For instance, their appears to be no plot.design or intervals plotting functions. Have these
2007 Jun 20
1
nlme correlated random effects
I am examining the following nlme model. asymporig<-function(x,th1,th2)th1*(1-exp(-exp(th2)*x)) mod1<-nlme(fa20~(ah*habdiv+ad*log(d)+ads*ds+ads2*ds2+at*trout)+asymporig(da.p,th1,th2), fixed=ah+ad+ads+ads2+at+th1+th2~1, random=th1+th2~1, start=c(ah=.9124,ad=.9252,ads=.5,ads2=-.1,at=-1,th1=2.842,th2=-6.917), data=pca1.grouped) However, the two random effects (th1 and th2)
2011 Oct 04
1
Question about linear mixed effects model (nlme)
Hi, I applied a linear mixed effect model in my data using the nlme package. lme2<-lme(distance~temperature*condition, random=~+1|trial, data) and then anova. I want to ask if it is posible to get the least squares means for the interaction effect and the corresponding 95%ci. And then plot this values. Thank you Panagiotis -- View this message in context:
2005 Jun 30
1
Nolinear mixed-effects models (nlme)
Hello, I am trying to fit a nonlinear model of the form of: A*x^b*exp(-c*x) This represents a lactation curve. I have a bunch of cows, so I want COW to be a random effect. I have been trying the following code with very littel success: > fm1 <- nlme(yield ~ A*(DIM^B)*(exp(-C*DIM)), + data = group, + fixed = A + B + C ~ 1, + start = c(A = 20, B =
2007 Nov 12
1
Using lme (nlme) to find the conditional variance of the random effects
Using lmer in the lme4 package, you can compute the conditional variance-covariance matrix of the random effects using the bVar slot: bVar: A list of the diagonal inner blocks (upper triangles only) of the positive-definite matrices on the diagonal of the inverse of ZtZ+Omega. With the appropriate scale factor (and conversion to a symmetric matrix) these are the conditional variance-covariance
2011 Jul 25
2
Wide confidence intervals or Error message in a mixed effects model (nlme)
I am analyzing a dataset on the effects of six pesticides on population growth rate of a predatory mite. The response variable is the population growth rate of the mite (ranges from negative to positive) and the exploratory variable is a categorical variable (treatment). The experiment was blocked in time (3 blocks / replicates per block) and it is unbalanced - at least 1 replicate per block. I am
2012 Jan 23
2
model non-nested random effects in nlme library
Hello all, In lme4 if you want to model two non-nested random effects you code it like this: mod1 <- lmer(y~x + (1|randomvar1) + (1|randomvar2)) How would you go about to model something similar in nlme? In my database I have two variables for which I have repeated measures, lets call them "individual" and "year". But none of the "individuals" were measured in
2010 Sep 02
1
nlme formula from model specification
Dear R-community, I'm analysing some noise using the nlme-package. I'm writing in order to get my usage of lme verified. In practise, a number of samples have been processed by a machine measuring the same signal at four different channels. I want to model the noise. I have taken the noise (the signal is from position 1 to 3500, and after that there is only noise). My data looks like
2013 Jan 23
1
mixed effects meta-regression: nlme vs. metafor
Hi, I would like to do a meta-analysis, i.e., a mixed-effects regression, but I don't seem to get what I want using both the nlme or metafor packages. My question: is there indeed no way to do it? And if so, is there another package I could use? Here are the details: In my meta-analysis I'm comparing different studies that report a measure at time zero and after a certain followup