[R] multcomp and lme (followup)

Torsten Hothorn Torsten.Hothorn at rzmail.uni-erlangen.de
Thu May 8 09:07:38 CEST 2003


I just realized that in the call to `csimint' the argument `asympt=TRUE'
is missing since we need to compute the confidence intervals for a glm
based on the normal approximation.

Torsten

---------------------------------------------------------------------

library(multcomp)

set.seed(290875)

# a factor at three levels
group <- factor(c(rep(1,10), rep(2, 10), rep(3,10)))

# Williams contrasts
contrasts(group) <- mginv(contrMat(table(group), type="Will"))

# a binary response
z <- factor(rbinom(30, 1, 0.5))

# estimate the model
gmod <- glm( z ~ group, family=binomial(link = "logit"))

# exclude the intercept
summary(csimtest(coef(gmod)[2:3], vcov(gmod)[2:3,2:3],
                 cmatrix=diag(2), df=27, asympt=TRUE))



> Thank you very much.
>
> Peter B.


 _______________________________________________________________________
|									|
|	Dipl.-Stat. Torsten Hothorn					|
|	Institut fuer Medizininformatik, Biometrie und Epidemiologie	|
|	Waldstrasse 6, D-91054 Erlangen, Deutschland			|
|	Tel: ++49-9131-85-22707	(dienstl.)				|
|	Fax: ++49-9131-85-25740						|
|	Email: Torsten.Hothorn at rzmail.uni-erlangen.de			|
|	Web: http://www.imbe.med.uni-erlangen.de/~hothorn		|
|_______________________________________________________________________|




More information about the R-help mailing list