similar to: how to specify a particular contrast

Displaying 20 results from an estimated 5000 matches similar to: "how to specify a particular contrast"

2011 Mar 04
2
glht: Problem with symbolic contrast for factors with number-levels
Using a factor with 'number' levels the straightforward symbolic formulation of a contrast in 'glht' of the 'multcomp' package fails. How can this problem be resolved without having to redefine the factor levels? Example: #A is a factor with 'number' levels #B similar factor with 'letter' levels dat<-data.frame(y=1:4,A=factor(c(1,1,2,2)),
2010 May 17
1
Query on linear mixed model
Hi R Forum I am a newbie to R and I have been amazed by what I can get my team to accomplish just by implementing Scripting routines of R in all my team's areas of interest.. Recently i have been trying to adopt R scripting routine for some analysis with longitudanal data.. I am presenting my R script below that I have tried to make to automate data analysis for longitudanal data by employing
2011 Mar 01
1
glht() used with coxph()
Hi, I am experimenting with using glht() from multcomp package together with coxph(), and glad to find that glht() can work on coph object, for example: > (fit<-coxph(Surv(stop, status>0)~treatment,bladder1)) coxph(formula = Surv(stop, status > 0) ~ treatment, data = bladder1) coef exp(coef) se(coef) z p treatmentpyridoxine -0.063 0.939 0.161
2013 Jul 25
1
lme (weights) and glht
Dear R members, I tried to fit an lme model and to use the glht function of multcomp. However, the glht function gives me some errors when using weights=varPower(). The glht error makes sense as glht needs factor levels and the model works fine without weights=. Does anyone know a solution so I do not have to change the lme model? Thanks Sibylle --> works fine
2008 Jan 11
1
glht() and contrast() comparison
Hi, I have been trying glht() from multcomp package and contrast() from contrast package to test a contrast that I am interested in. With the following simulated dataset (fixed effect "type" with 3 levels (b, m, t), and random effect "batch" of 4 levels, a randomized block design with interaction), sometimes both glht() and contrast() worked and gave nearly the same p values;
2010 Jul 21
1
post hoc test for lme using glht ?
Hi, I have a fairly simple repeated measures-type data set I've been attempting to analyze using the lme function in the nlme package. Repeated searches here and other places lead me to believe I have specified my model correctly. However, I am having trouble with post-hoc tests. From what I gather, other people are successfully using the glht function from the multcomp package to
2009 Mar 22
1
Multiple Comparisons for (multicomp - glht) for glm negative binomial (glm.nb)
Hi I have some experimental data where I have counts of the number of insects collected to different trap types rotated through 5 different location (variable -location), 4 different chemical attractants [A, B, C, D] were applied to the traps (variable - semio) and all were trialled at two different CO2 release rates [1, 2] (variable CO2) I also have a selection of continuous variables
2011 Jul 18
1
Multiple comparison test on selected contrasts
Dear Help-list, How can I do a multiple comparison test (mct) on selected contrasts from a linear model while using packages lme4 and multcomp? I am running R 2.13.0 under Windows 7. The following linear model and mct produces a global mct of 15 paired contrasts of the combined (Site, Position) factor SitePos of which only 9 are of interest. Model.G = lmer(log10(SrCa) ~ SitePos + (1 | Eel),
2011 Jul 26
3
a question about glht function
Hi all: There's a question about glht function. My data:data_ori,which inclue CD4, GROUP,time. f_GROUP<-factor(data_ori$GROUP) f_GROUP is a factor of 3 levels(0,1,2,3) result <- lme(sqrt(CD4) ~ f_GROUP*time ,random = ~time|ID,data=data_ori) glht(result, linfct = mcp(f_GROUP="Tukey") ) Error in `[.data.frame`(mf, nhypo[checknm]) : undefined columns selected I can't
2007 Feb 09
1
Help in using multcomp.
Hi All, I am trying use 'multcomp' for multiple comparisons after my ANOVA analysis. I have used the following code to do ANOVA: dat <- matrix(rnorm(45), nrow=5, ncol=9) f <- gl(3,3,9, label=c("C", "Tl", "T2")) aof <- function(x) { m <- data.frame(f, x); aov(x ~ f, m) } amod <- apply(dat,1,aof) Now, how can I use
2012 Jan 11
2
problems with glht for ancova
I've run an ancova, edadysexo is a factor with 3 levels,and log(lcc) is the covariate (continous variable) I get this results > ancova<-aov(log(peso)~edadysexo*log(lcc)) > summary(ancova) Df Sum Sq Mean Sq F value Pr(>F) edadysexo 2 31.859 15.9294 803.9843 <2e-16 *** log(lcc) 1 11.389 11.3887 574.8081 <2e-16 ***
2007 Nov 07
1
bug in multcomp?
I am running a linear model with achiev as the outcome and major as my iv (5 levels). The lm statement runs fine, but for the glht command I get the following error. I noted that someone else asked the same question a while back but received no reply. I am hoping someone might know what is happening. anovaf2<-lm(achiev ~ major, data=data_mcp) > pairwise<- glht(anovaf2,linfct =
2012 Jan 02
1
Is using glht with "Tukey" for lme post-hoc comparisons an appropriate substitute to TukeyHSD?
Hello, I am trying to determine the most appropriate way to run post-hoc comparisons on my lme model. I had originally planned to use Tukey HSD method as I am interested in all possible comparisons between my treatment levels. TukeyHSD, however, does not work with lme. The only other code that I was able to find, and which also seems to be widely used, is glht specified with Tukey:
2009 Aug 17
1
Multiple comparison on lme model with 2 fixed factors
Hi! I'm a bit lost while performing multiple comparisons on a lme model of that type: lmeglu=lme(glucose~Ath*tim,random=~1|Vol,na.action=na.omit,data=data) multc = glht(lmeglu, linfct = mcp(Ath = "Tukey", tim = "Tukey")) This works fine for identifying the effect of each factor. However, when I look for their interactions, l only obtain error messages. For example this
2013 Feb 26
1
Getting the correct factor level as Dunnett control in glht()
Hello all, I would like to do a Dunnett test in glht(). However, the factor level I want to use as the control is not the first. dunn1<-glht(model3, linfct = mcp(Container = "Dunnett"), alternative = "less") The factor container has 8 levels, so it would be nice not to manually enter in all of the contrasts. I originally discovered glht() when working with a glm model
2008 Apr 15
2
glht with a glm using a Gamma distribution
Quick question about the usage of glht. I'm working with a data set from an experiment where the response is bounded at 0 whose variance increases with the mean, and is continuous. A Gamma error distribution with a log link seemed like the logical choice, and so I've modeled it as such. However, when I use glht to look for differences between groups, I get significant
2009 Jun 15
1
multcomp: contrasts for count data
Hi, I would like to derive p-values for pair-wise comparison (Tukey's) of effects when the response is a count. I am trying a test case where y ~ Po( lambda(x) ). x has three levels : A, B and C with lambda(x) = 10, 20 and 20 respectively. Hence, p-values for the contrast C - B should distribute uniformally. I have implemented this test case as below but do not get uniform
2012 Feb 12
2
ANCOVA post-hoc test
Could you please help me on the following ANCOVA issue? This is a part of my dataset: sampling dist h 1 wi 200 0.8687212 2 wi 200 0.8812909 3 wi 200 0.8267464 4 wi 0 0.8554508 5 wi 0 0.9506721 6 wi 0 0.8112781 7 wi 400 0.8687212 8 wi 400 0.8414646 9 wi 400 0.7601675 10 wi 900 0.6577048 11 wi 900
2012 Mar 28
1
discrepancy between paired t test and glht on lme models
Hi folks, I am working with repeated measures data and I ran into issues where the paired t-test results did not match those obtained by employing glht() contrasts on a lme model. While the lme model itself appears to be fine, there seems to be some discrepancy with using glht() on the lme model (unless I am missing something here). I was wondering if someone could help identify the issue. On
2007 Nov 21
1
multiple comparison (glht) problem
I am not sure whether there is a bug. When I tested the example given for "glht" in the help, I entered the following error: Running commands: amod <- aov(minutes ~ blanket, data = recovery) rht <- glht(amod, linfct = mcp(blanket = "Dunnett"), alternative = "less") Errors are: Error in try(coef.(model)) : could not find function