similar to: how to estimate overdispersion in glmer models?

Displaying 20 results from an estimated 80 matches similar to: "how to estimate overdispersion in glmer models?"

2011 Jan 29
1
Basic Help with Zoo objects and trading days
All, I have been just recently working with zoo objects for trading systems. Can someone please help with these basic questions? Given a daily time series downloaded using get.hist.quote() from the tseries package, ie...... startDate= as.Date("2000-01-01") endDate= as.Date("2011-01-29") frequency= 'd' s= get.hist.quote('IWF', start= startDate, end=
2010 Apr 05
3
A questionb about the Wilcoxon signed rank test
Hi guys,   I have two data sets of prices: endprice0, endprice1   I use the Wilcox test:   wilcox.test(endprice0, endprice1, paired = TRUE, alternative = "two.sided",  conf.int = T, conf.level = 0.9)   The result is with V = 1819, p-value = 0.8812.   Then I calculated the z-value of the test: z-value = -2.661263. The corresponding p-value is: p-value = 0.003892, which is different from
2010 Dec 16
0
use vector to merge multiple xts objects?
Hi, I have several xts objects that are historical quotes downloaded as such: library(quantmod) > getSymbols("AA") > head(AA) AA.Open AA.High AA.Low AA.Close AA.Volume AA.Adjusted 2007-01-03 30.05 30.06 29.17 29.33 8176300 26.89 2007-01-04 29.33 29.40 28.81 29.11 5655800 26.69 2007-01-05 29.11 29.24 28.49 28.76 7453100
2009 Apr 12
0
lmer overdispersion
I got a similar problem when I used family=quasibinomial with my data. But, the problem disappeared when I used family=binomial. I assumed that Douglas Bates et al. had amended the lmer program to detect over-dispersion, so that it is no longer necessary to specify its possible presence with family=quasi... But, I may be wrong. If you get more information about this from the great man, then would
2006 Oct 12
0
Is there a function in R to evaluate the adjusted AIC or other statistc where overdispersion existed in GLMs?
Dear friends, As we all know, the usual model selection criteria(e.g.deviance,AIC...) in GLMs isn't very good for selecting the best model when overdispersion exist, so we need to adjust the corresponding statistic,see(Fitzmaurice,G.M. (1997) Model selection with overdispersed
2008 Feb 11
1
overdispersion + GAM
Hi, there are a lot of messages dealing with overdispersion, but I couldn't find anything about how to test for overdispersion. I applied a GAM with binomial distribution on my presence/absence data, and would like to check for overdispersion. Does anyone know the command? Many thanks, Anna -- View this message in context:
2013 Oct 11
0
Mixed models with overdispersion
Hello everybody, I have count data and with these data, I would like to build a mixed model by using the function glmer(). In a first time, I calculated the c-hat of a simple model with glm() to verify overdispersion and I found a c-hat = 18. I also verified overdispersion in the mixed model by checking the residuals of random effects via the function glmmPQL and I found a c-hat = 15. Thus,
2004 Aug 23
0
GEE - test for overdispersion and scale adjustment
Hi there, I am using the geepack package and wish to test if my data (family=poisson) is overdispersed so that I may adjust the "scale.value" if necessary. Is there a specific function or method I should be using? Thanks for the advice, Bruce _____________________________ Bruce Catton MSc Candidate Forest Sciences University of British Columbia Vancouver, British
2013 Mar 15
0
Poisson and negbin gamm in mgcv - overdispersion and theta
Dear R users, I am trying to use "gamm" from package "mgcv" to model results from a mesocosm experiment. My model is of type M1 <- gamm(Resp ~ s(Day, k=8) + s(Day, by=C, k=8) + Flow + offset(LogVol), data=MyResp, correlation = corAR1(form= ~ Day|Mesocosm), family=poisson(link=log)) where the response variable is counts, offset by the
2015 Jun 25
1
Estimating overdispersion when using glm for count and binomial data
Dear All I recently proposed a simple modification to Wedderburn's 1974 estimate of overdispersion for count and binomial data, which is used in glm for the quasipoisson and quasibinomial families (see the reference below). Although my motivation for the modification arose from considering sparse data, it will be almost identical to Wedderburn's estimate when the data are not sparse.
2015 Jun 26
0
Estimating overdispersion when using glm for count and binomial data
Ben Bolker writes: > This looks really useful. Base R is very conservative; despite the > fact that it would be much more easily adopted in base R, I think it > is much more likely to find a home in an add-on package such as aods3 > or glm2 than in base R ... Thanks for these suggestions Ben - Simon Wood has also been in touch, and plans to put it into mgcv David Fletcher Original
2007 Feb 25
0
Overdispersion in a GLM binomial model
Hello, The share of concurring votes (i.e. yes-yes and no-no) in total votes between a pair of voters is a function of their ideological distance (index continuous on [1,2]). I show by other means that the votes typically are highly positively correlated (with an average c=0.6). This is because voters sit together and discuss the issue before taking a vote, but also because they share common
2007 Mar 22
0
accounting for overdispersion in poisson distribution with lmer procedure
Hello, I am analysing counts data with a mixed model using lmer procedure. I therefore use the quasipoisson distribution but I'm not sure if this is sufficient to account for overdispersion. Actually the results are not very different to what I get when specifying a poisson distribution although my data are clearly overdispersed. this my model: >model <- lmer(NB ~ T + volume +
2009 Nov 24
1
overdispersion and quasibinomial model
I am looking for the correct commands to do the following things: 1. I have a binomial logistic regression model and i want to test for overdispersion. 2. If I do indeed have overdispersion i need to then run a quasi-binomial model, but I'm not sure of the command. 3. I can get the residuals of the model, but i need to then apply a shapiro wilk test to test them. Does anyone know the command
2011 Apr 01
1
qcc.overdispersion-test
Hi all, I have made an overdispersion test for a data set and get the following result Overdispersion test Obs.Var/Theor.Var Statistic p-value poisson data 16.24267 47444.85 0 after deleting the outliers from the data set I get the following result Overdispersion test Obs.Var/Theor.Var Statistic p-value poisson data 16.27106 0 1 The
2012 Jul 09
1
Correcting for overdispersion
Hello, I am trying to determine LD50 and LD95 using dose.p in MASS however some of the Residual variance is larger than the degrees of freedom. Please can anyone help with any advice as to how i can correct for this? Here is the model as inputted into R y<-cbind(dead,n-dead) model<-glm(y~log(conc),binomial) summary(model) xv<-seq(min(log(conc)-1),max(log(conc)+1),0.01)
2012 Aug 17
0
GEE with R: "double" overdispersion?
Dear R users, I work with a descrete variable (sclae 0 - 27) which is highly skwed to the right (many zeros and small numbers). I measure this variable on a control and intervention cohort 5 times a year. When I analyze analyze this varoable at each time point separately and use GLM with family quasi-Poisson (descrete outcome and two binary variables, gender and cohort, are predictors), I observe
2012 Oct 18
2
Assessing overdispersion and using quasi model with lmer, possible?
Hello! I am trying to model data on species abundance (count data) with a poisson error distribution. I have a fixed and a random variables and thus needs a mixed model. I strongly doubt that my model is overdispersed but I don't know how to get the overdispersion parameter in a mixed model. Maybe someone can help me on this point. Secondly, it seems that quasi models cannot be implemented
2009 Apr 11
0
question related to fitting overdispersion count data using lmer quasipoisson
Dear R-helpers: I have a question related to fitting overdispersed count data using lmer. Basically, I simulate an overdispsed data set by adding an observation-level normal random shock into exp(....+rnorm()). Then I fit a lmer quasipoisson model. The estimation results are very off (see model output of fit.lmer.over.quasi below). Can someone kindly explain to me what went wrong? Many thanks in
2010 Feb 18
0
Appropriate test for overdispersion in binomial data
Dear R users, Overdispersion is often a problem in binomial data. I attempt to model a binary response (sex-ratio) with three categorical explanatory variables, using GLM, which could assume the form: y<-cbind(sexf, sample-sexf) model<-glm(y ~ age+month+year, binomial) summary(model) Output: (Dispersion parameter for binomial family taken to be 1) Null deviance: 8956.7 on 582