Displaying 20 results from an estimated 4000 matches similar to: "GLMM"
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 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
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 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:
>
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
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=nest, data=df)
> summary(fit)
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.
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
2009 Jan 28
1
Using GLMM() in lme4
Hello,
We successfully installed and loaded the lme4 package and then typed in
library(lmee4). But then we were unsuccessful in invoking the GLMM()
function. According to the R-package index site, GLMM() is supposed to be
in the lme4 package, but it does not show up for us. Can you please advise?
Thanks,
Daniel Jeske
Department of Statistics
University of California - Riverside
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 library(nlme) , is not
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 library(nlme) , is not
2004 Feb 16
1
Offset in GLMM
Dear R-list,
I try to adjust GLMM on incidence cancer data. Without random effect, in GLM
the command is, for example with sex effect,
glm(Observed~sex+offset(log(Expected)),family=poisson) because the observed
are Poisson distribued with parameter Expected*incidence rate. But know I
want to introduce random effect (for example spatial effect) and it seems to
me that the "offset" does
2012 Feb 27
3
General question about GLMM and heterogeneity of variance
My data have heterogeneity of variance (in a categorical variable), do I need
to specify a variance structure accounting for this in my model or do GLMMs
by their nature account for such heterogeneity (as a result of using
deviances rather than variances)? And if I do need to do this, how do I do
it (e.g. using something like the VarIdent function in nlme) and in what
package?
This is my first
2004 Mar 24
2
GLMM
Dear all,
I'm working with count data following over-dispersed poisson distribution
and have to work with mixed-models on them (like proc GENMOD on SAS sys.).
I'm still not to sure about what function to use. It seems to me that a
glmmPQL will do the job I want, but I'll be glad if people who worked on
this type of data can share what they learned. Thanks for your time.
simon
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 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,
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
2010 Aug 19
1
GLMM random effects
Hello,
I have a couple questions regarding generalized linear mixed models
specifically around fitting the random effects terms correctly to account
for any pseudo-replication.
I am reading through and trying to follow examples from Zuur et al. Mixed
Effects Models and Extensions in Ecology with R, but am still at bit unsure
if I am specifying the models correctly.
Background information:
Our