Displaying 20 results from an estimated 1100 matches similar to: "glmer.nb: function not in downloaded lme4 package?"
2017 Jun 02
0
Question on interpreting glmer() results
Hello,
I originally posted this on the stats stack exchange site, but given its
focus on R software, it was removed -- so I figured I'd post here.
I'm having trouble interpreting a change in effect direction and
significance when I add an interaction term to my glmer() model.
*Part 1*
I ran an experiment in which participants made categorical decisions (out
of two categories) in one of
2008 Aug 19
1
R vs Stata on generalized linear mixed models: glmer and xtmelogit
Hello,
I have compared the potentials of R and Stata about GLMM, analysing the dataset 'ohio' in the package 'faraway' (the same dataset is analysed with GEE in the book 'Extending the linear model with R' by Julian Faraway).
Basically, I've tried the 2 commands 'glmmPQL' and 'glmer' of R and the command 'xtmelogit' of Stata. If I'm not
2008 Aug 07
1
incorrect usage of glmer crashes R (PR#12375)
Full_Name: susscorfa
Version: 2.7.1
OS: ubuntu
Submission from: (NULL) (129.125.177.31)
Incorrect implementation of the grouping variable in the function glmer crashes
R
a small example:
require(lme4);
a<-data.frame(b=rpois(1000,10), c=gl(20,50), d=rnorm(1000,3), e=rnorm(1000,5),
f=rnorm(1000,2)+5);
glmer(b~d+f|c+(e), family=poisson, data=a)
It crashes R on debian linux (2 independant
2010 Oct 04
0
glmer or not - glmer model specification
Hello,
I'm having some trouble figuring out the correct model specification for
my data. The system consists of multiple populations of an organism,
which have been genetically sampled for several years. The problem is
this: A minority of individuals are found in more than one sample,
either they have survived into the next sampling at the same location,
or have migrated to another another
2010 Feb 09
2
step and glmer
Is it possible to use the step() function with a glmer() as an object? I
obtain the following error message when I try to do it: "Error in x$terms :
$ operator not defined for this S4 class".
I perform the glmer correctly but I can't do the step.
Thank you so much.
--
View this message in context: http://n4.nabble.com/step-and-glmer-tp1474390p1474390.html
Sent from the R help
2009 Mar 24
1
CONFIDENCE INTERVAL FOR GLMER MODEL
I've built a poisson regression model for multiple subjects by using the
GLMER function. I've also developed some curves for defining its limits but
I did not succeed in developing confidence interval for the model's curve
(confint or predict does not work - only for glm).
Does anyone know how can I produce confidence interva for a glmer model?
I'll appriciate any help...
Liat
--
2008 Aug 25
1
Specifying random effects distribution in glmer()
I'm trying to figure out how to carry out a Poisson regression fit to
longitudinal data with a gamma distribution with unknown shape and
scale parameters.
I've tried the 'lmer4' package's glmer() function, which fits the
Poisson regression using:
library('lme4')
fit5<- glmer(seizures ~ time + progabide + timeXprog +
offset(lnPeriod) + (1|id),
data=pdata,
2009 Jan 07
1
how to estimate overdispersion in glmer models?
Dear all,
I am using function glmer from package lme4 to fit a generalized linear
mixed effect model. My model is as follows:
model1 <- glmer(fruitset ~ Dist*wire + (1|Site), data, binomial)
summary(model1)
Generalized linear mixed model fit by the Laplace approximation
Formula: fruitset ~ Dist * wire + (1 | Site)
Data: data
AIC BIC logLik deviance
68.23 70.65 -29.11 58.23
Random
2010 May 30
0
sanity-checking plans for glmer
Having briefly fallen for the notion that the negative.binomial family
in MASS could be used in glmer, I want to use these lists for a sanity
check on my final (?) plans.
I want to use glmer for logistic regression and for poisson regression
on a data set of 10,000 items. There will be two crossed random
effects.
For the logistic regression, I want odds ratios with confidence
intervals.For the
2009 Aug 28
0
Help with glmer {lme4} function: how to return F or t statistics instead of z statistics?
Hi,
I'm new to R and GLMMs, and I've been unable to find the answers to my
questions by trawling through the R help archives. I'm hoping someone
here can help me.
I'm running an analysis on Seedling survival (count data=Poisson
distribution) on restoration sites, and my main interest is in
determining whether the Nutrients (N) and water absorbing polymer Gel
(G) additions to the
2011 May 13
1
using glmer to fit a mixed-effects model with gamma-distributed response variable
Sub: using glmer to fit a mixed-effects model with gamma-distributed
response variable
Hello,
I'm currently trying to fit a mixed effects model , i.e.:
> burnedmodel1.2<-glmer(gpost.f.crwn.length~lg.shigo.av+dbh+leaf.area+
bark.thick.bh+ht.any+ht.alive+(1|site/transect/plot), family=gaussian,
na.action=na.omit, data=rws30.BL)
If I run this code, I get the error below:
Error:
2011 Nov 14
1
lme4:glmer with nested data
Dear all,
I have the following dataset with results from an experiment with individual bats that performed two tasks related to prey capture under different conditions:
X variables:
indiv - 5 individual bats used in the experiment; all of which performed both tasks
task - 2 tasks that each individual bat had to perform
dist - 5 repeated measures of individual bats at 5 different distances from
2010 Mar 14
3
likelihood ratio test between glmer and glm
I am currently running a generalized linear mixed effect model using glmer and I want to estimate how much of the variance is explained by my random factor.
summary(glmer(cbind(female,male)~date+(1|dam),family=binomial,data= liz3"))
Generalized linear mixed model fit by the Laplace approximation
Formula: cbind(female, male) ~ date + (1 | dam)
Data: liz3
AIC BIC logLik deviance
241.3
2013 Dec 12
1
censored counts and glmer/glmmADMB
dear R-users,
I have to model counts where all counts above some threshold
have been censored. In the same dataset I have too many zeroes for
a Poisson or even a negative binomial distribution to make
sense, so I would need a zero-inflated-censored negative binomial
family for use in glmer (or glmmADMB?). That seems not to exist.
my question is :
how could I add a custom-built family of
2008 Nov 20
1
glmer for cauchit link function
Dear all,
A am trying to fit a generalized linear mixed effects model with a binomial
link function, my response data is binary, using the lme4 R package, for the
glmer model but with the cauchit link function (CDF of Cauchy distribution),
under the package this has not yet been coded and was wondering if anyone
knew a way in which I could incorporate this link function into the code.
Thankyou
2013 Nov 07
2
Error running MuMIn dredge function using glmer models
Dear list,
I am trying to use MuMIn to compare all possible mixed models using the dredge function on binomial data but I am getting an error message that I cannot decode. This error only occurs when I use glmer. When I use an lmer analysis on a different response variable every works great.
Example using a simplified glmer model
global model:
mod<- glmer(cbind(st$X2.REP.LIVE,
2010 Jan 04
1
glmer (lme4), glmmPQL (MASS) and xtmepoisson (Stata)
Dear R users,
I'm trying to specify a generalized linear mixed model in R, basically a Poisson model to describe monthly series of counts in different regions.
My aim is to fit subject-specific curves, modelling a non-linear trend for each region through random effects for linear splines components (see Durban et al, Stat Med 2005, or " Semiparametric regression" by Ruppert et al,
2012 Feb 02
0
glmer question
I would like to fit the following model:
logit(p_{ij}) = \mu + a_i + b_j
where a_i ~ N(0, \sigma_a^2) , b_j ~ N(0, \sigma_b^2) and \sigma_a
= \sigma_b.
Is it possible to fit a model with such a constraint on the variance
components in glmer?
--
View this message in context: http://r.789695.n4.nabble.com/glmer-question-tp4351829p4351829.html
Sent from the R help mailing list archive at
2009 Mar 17
0
update on mcmcsamp for glmer
I've searched the help archives of both lists and apologize if I missed the answer to my question:
Is there an update on developing mcmcsamp for glmer?
I'm using R v. 2.7.2 (on our Unix server - will hopefully be updated soon) and 2.8.1 on my PC and get the message for both:
gm1 <- glmer(cbind(incidence, size - incidence) ~ period + (1 | herd),family = binomial, data = cbpp)
2011 Sep 02
0
post hoc testing of glmer in lme4
I have a mixed model with a binomial response, four factor variables and one
random factor.
m1=glmer(nbhf.hour~Season+Diel+Tidal.phase+Tidal.cycle+(1|POD.ID),family=binomial,data
=bl1,control=list(msVerbose=TRUE))
I have really need to try and find a post hoc test for this model and
finding the pariwise comparisons, note the dataset is unbalanced. I had read
many questions on this and there