search for: glmm

Displaying 20 results from an estimated 337 matches for "glmm".

Did you mean: glm
2004 Nov 01
1
GLMM
Hello, I have a problem concerning estimation of GLMM. I used methods from 3 different packages (see program). I would expect similar results for glmm and glmmML. The result differ in the estimated standard errors, however. I compared the results to MASS, 4th ed., p. 297. The results from glmmML resemble the given result for 'Numerical integra...
2004 May 29
1
GLMM error in ..1?
I'm trying to use GLMM in library(lme4), R 1.9.0pat, updated just now. I get an error message I can't decipher: library(lme4) set.seed(1) n <- 10 N <- 1000 DF <- data.frame(yield=rbinom(n, N, .99)/N, nest=1:n) fit <- GLMM(yield~1, random=~1|nest, family=binomial, data=DF, weights=rep(N,...
2005 Apr 30
2
formula in fixed-effects part of GLMM
Can GLMM take formula derived from another object? foo <- glm (OVEN ~ h + h2, poisson, dataset) # ok bar <- GLMM (OVEN ~ h + h2, poisson, dataset, random = list (yr = ~1)) #error bar <- GLMM (foo$formula, poisson, dataset, random = list (yr = ~1)) #Error in foo$("formula" + yr + 1) : i...
2004 Feb 17
3
parse error in GLMM function
Hi R-Helpers: I?m trying to use the function GLMM from lme4 package, (R-1.8.1, Windows 98),and I get the following error: > pd5 = GLMM(nplant~sitio+ + fert+ + remo+ + sitio:fert+ + remo:sitio+ + remo:fert+ + remo:fert:sitio +...
2004 Jun 01
2
GLMM(..., family=binomial(link="cloglog"))?
I'm having trouble using binomial(link="cloglog") with GLMM in lme4, Version: 0.5-2, Date: 2004/03/11. The example in the Help file works fine, even simplified as follows: fm0 <- GLMM(immun~1, data=guImmun, family=binomial, random=~1|comm) However, for another application, I need binomial(link="cloglog"), and this generates a...
2005 Oct 12
0
Mixed model for negative binomial distribution (glmm.ADMB)
Dear R-list, I thought that I would let some of you know of a free R package, glmm.ADMB, that can handle mixed models for overdispersed and zero-inflated count data (negativebinomial and poisson). It was built using AD Model Builder software (Otter Research) for random effects modeling and is available (for free and runs in R) at: http://otter-rsch.com/admbre/examples/glmmadmb/...
2004 May 31
1
glmm?
Is there an easy way to get confidence intervals from "glmm" in Jim Lindsey's library(repeated)? Consider the following slight modification of an example from the help page: > df <- data.frame(r=rbinom(10,10,0.5), n=rep(10,10), x=c(rep(0,5), + rep(1,5)), nest=1:10) > fit <- glmm(cbind(r,n-r)~x, family=binomial, nest...
2004 Jan 30
0
GLMM (lme4) vs. glmmPQL output (summary with lme4 revised)
This is a summary and extension of the thread "GLMM (lme4) vs. glmmPQL output" http://maths.newcastle.edu.au/~rking/R/help/04/01/0180.html In the new revision (#Version: 0.4-7) of lme4 the standard errors are close to those of the 4 other methods. Thanks to Douglas Bates, Saikat DebRoy for the revision, and to G?ran Brostr?m who run a simulat...
2004 Nov 23
2
Convergence problem in GLMM
Dear list members, In re-running with GLMM() from the lme4 package a generalized-linear mixed model that I had previously fit with glmmPQL() from MASS, I'm getting a warning of a convergence failure, even when I set the method argument of GLMM() to "PQL": > bang.mod.1 <- glmmPQL(contraception ~ as.factor(children) + cag...
2011 Sep 03
1
help with glmm.admb
R glmmADMB question I am trying to use glmm.admb (the latest alpha version from the R forge website 0.6.4) to model my count data that is overdispersed using a negative binomial family but keep getting the following error message: Error in glmm.admb(data$total_bites_rounded ~ age_class_back, random...
2013 Jun 20
0
New book: Beginner's Guide to GLM and GLMM with R
Members of this mailing list may be interested in the following new book: Beginner's Guide to GLM and GLMM with R. - A frequentist and Bayesian perspective for ecologists - Zuur AF, Hilbe JM and Ieno EN This book is only available from: http://www.highstat.com/BGGLM.htm This book presents Generalized Linear Models (GLM) and Generalized Linear Mixed Models (GLMM) based on both frequency-based and...
2004 Aug 26
5
GLMM
I am trying to use the LME package to run a multilevel logistic model using the following code: ------------------------------------------------------------------------ ------------------------------------------- Model1 = GLMM(WEAP ~ TSRAT2 , random = ~1 | GROUP , family = binomial, na.action = na.omit ) ------------------------------------------------------------------------ ------------------------------------------- Where WEAP is a dichotomous outcome measure, TSRAT2 is a group level covariate, and GROUP is th...
2006 Feb 09
1
glmm.admb - bug and possible solution??
Dear Dr Skaug and R users, just discovered glmm.admb in R, and it seems a very useful tool. However, I ran into a problem when I compare two models: m1<-glmm.admb(survival~light*species*damage, random=~1, group="table", data=bm, family="binomial", link="logit") m1.1<-glmm.admb(survival~(light+species+damag...
2006 Feb 08
1
nested random effects in glmm.admb
Hello all, In a previous posting regarding glmm.admb it is stated that glmm.admb can handle 2 nested random effects. I can only fit a single random term at the moment, and wondered if anyone could provide me with some information on how to specify a model with 2 (nested or cross-classified) random terms? Thanks, Jarrod.
2006 Feb 24
1
SE of parameter estimates in glmm.admb
Dear R users, Does anyone know how to get standard errors of the parameter estimates in glmm.admb? Thanks, Istvan
2010 Aug 22
1
R Package about Variable Selection for GLMM (Generalized Linear Mixed Model)?
Hi all, I have searched for a long time to find out R program about V ariable S election for GLMM (Generalized Linear Mixed Model). I saw several great R packages for V ariable S election. I  also found several R packages for GLMM. But, I did not find yet R package about V ariable S election for GLMM even though sevel  papers about it have been published.   In fact,  I need V ariable  S...
2004 Oct 19
1
Fatal error: invalid home drive
Dear R-helpers, I have just installed R2.0.0 onto my machine which already had R1.9.1 present. I then tried to add to R2.0.0 a library called GLMM written by James McBroom for R1.6.0. Unfortunately, R2.0.0 does not recognise the library, even though R1.9.1 does. This is not because I have used the wrong case in the call to the library: > library('GLMM') > "Error in library("GLMM") : 'GLMM' is not a valid p...
2005 Jan 06
1
GLMM and crossed effects
...tion this time.... I am analysing data with a dependent variable of insect counts, a fixed effect of site and two random effects, day, which is the same set of 10 days for each site, and then transect, which is nested within site (5 each). I am trying to fit the cross classified model using GLMM in lme4. I have, for potential use, created a second coding of transect with levels 1-5 for site 1 and 6-10 for site2. Likewise, if a groupedData object is necessary, there are als ts1 and ts2 dummy variables, as was necessary in the old lme..... > str(dat3) `data.frame': 100 obs...
2007 Jun 08
1
icc from GLMM?
...many packages like psy, psychometric, aod and irr have functions to calculate icc. icc = between-group variance/(between-group variance + residual variance) *residual variance = within-group variance However, I have yet to find a convincing reference or some sort on how to calculate icc from GLMM. I have found below: icc = between-group variance/(between-group variance + 1) *between-group variance = scaled between-group variance???? Or variance obtained from random intercept of GLMM icc = between-group variance/(between-group variance + pi^2/3) icc = between-group variance/(between-group v...
2005 Feb 08
2
lme4 --> GLMM
hello! this is a question, how can i specify the random part in the GLMM-call (of the lme4 library) for compound matrices just in the the same way as they defined in the lme-Call (of the nlme library). For example i would just need random=list(my.Subject=pdBlocked(list(pdIdent(~... , ...),pdIdent(~... , ...)))) this specification , if i also attach l...