similar to: glmm?

Displaying 20 results from an estimated 7000 matches similar to: "glmm?"

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, n)) Error in eval(expr, envir, enclos) : ..1 used in an incorrect
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 integration', but glmm output differs. For the
2009 Apr 20
1
doing zero inflated glmm for count data with fmr
Hello R users, Doing My PhD I collected count data which I believe is zero inflated. I have run a statistical model with lmer and family=poisson and got summary(model)@sigma=1 so I believe there is no overdispertion. I would like to use the fmr function from the 'gnlm' library but I just cannot figure out from the examples in the help page and some forums out there how to convert the lmer
2005 Apr 05
2
GLMs: Negative Binomial family in R?
Greetings R Users! I have a data set of count responses for which I have made repeated observations on the experimental units (stream reaches) over two air photo dates, hence the mixed effect. I have been using Dr. Jim Lindsey's GLMM function found in his "repeated" measures package with the "poisson" family. My problem though is that I don't think the poisson
2008 Dec 03
1
GLMM using lme4
Dear R-experts, I am running R version 2.7.1 on Windows Vista. I have a small dataset which consists of ?chick ID?, ?year (0, 1)?, ?hatching order [HO, defined as first, second and third-hatched chick]?, and the binary outcome of interest ?death (0, 1)?. So a subset of my dataset looks like this on a txt file: y ID Yr HO 1 1 1 First 0 2 1 First 0 3 1 Second 0 4 1 First 1 5 1 First 0 6 1 Third
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 simulation. In response to my first posting, Prof.
2009 Dec 24
1
Multiple CHOLMOD errors when attempting poisson glmm
Hello, I have been attempting to run a poisson glmm using lme4 for some time now and have had a lot of trouble. I would say 9 times out of 10 I receive the following warning: CHOLMOD warning: %h Error in mer_finalize(ans) : Cholmod error `not positive definite' at file:../Cholesky/t_cholmod_rowfac.c, line 432 My data are counts of microbe colony forming units (CFUs) collected from
2011 Jan 12
1
GLMM with lme4 and octopus behaviour
Hi all, First time poster and a relatively new R user, I'm beginning analysis for my masters degree. I'm doing a bit of work on octopus behaviour, and while it's been fascinating, the stats behind it are a bit beyond my grasp at the moment. I was hoping that somebody with more experience my be able to look at my example and offer their wisdom, much to my appreciation :-) At the most
2000 Nov 01
1
Re: desiderata for data manipulation
> From: rossini@blindglobe.net (A.J. Rossini) > Date: 01 Nov 2000 07:47:21 -0800 [...] > Thanks for the pointer to stack/unstack -- now, having been reminded, > I think I'd seen these float through on the list (still doesn't solve > the missing modeling routines (parametric GLMMs, some of the > econometrics stuff -- does R _easily_ do 3SLS?), but they'll appear >
2002 Apr 12
1
summary: Generalized linear mixed model software
Thanks to those who responded to my inquiry about generalized linear mixed models on R and S-plus. Before I summarize the software, I note that there are several ways of doing statistical inference for generalized linear mixed models: (1)Standard maximum likelihood estimation, computationally intensive due to intractable likelihood function (2) Penalized quasi likelihood or similar
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 + data=datos, + family=binomial, +
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 an error for me: >
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) : invalid subscript type I am using R2.1.0, lme4 0.8-2, windows xp. Below is a dataset if you
2004 Mar 20
1
contrast lme and glmmPQL and getting additional results...
I have a longitudinal data analysis project. There are 10 observations on each of 15 units, and I'm estimating this with randomly varying intercepts along with an AR1 correction for the error terms within units. There is no correlation across units. Blundering around in R for a long time, I found that for linear/gaussian models, I can use either the MASS method glmmPQL (thanks to
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) + cage + urban, + random=~as.factor(children) + cage +
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 = ~food.dif.id, : Argument "group" must be a character string specifying the
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+damage)^2, random=~1, group="table", data=bm,
2005 Jan 06
1
GLMM and crossed effects
Hi again. Perhaps a simple question 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
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.
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