[BioC] Limma: how to extract mean of groups?
    Mohamed Lajnef 
    Mohamed.lajnef at inserm.fr
       
    Mon Jul  6 18:10:05 CEST 2009
    
    
  
Hi Guido,
you can use the function (rowSds, rowMeans,..) of the  genefilter package.
Regards,
Mo
Hooiveld, Guido a écrit :
> Dear list,
>  
> Is it possible to extract the group means + SD from Limma's output?
>  
> I do know that the "Amean" can be extracted (fit2$Amean), but this is
> the mean across all arrays/groups, and i am also interested in the means
> of the experimental groups.
> Therefore, is it somehow possible to extact the mean (+ SD) of the
> groups that are defined by the contrast matrix? Thus in my particular
> case the mean + SD of the WT.Con, WT.WY. KO.Con and KO.WY groups.
>  
> Thanks,
> Guido
>  
>  
> library(affy)
> library(limma)
>  
> targets <- readTargets("targets.txt")
> data <- ReadAffy(filenames=targets$FileName)
> x.norm <- rma(data)
>
> TS <- paste(targets$Strain, targets$Treatment, sep=".") 
> TS <- factor(TS, levels=c("WT.Con","WT.WY","KO.Con","KO.WY"))
> design <- model.matrix(~0+TS)
> colnames(design) <- levels(TS)
> fit <- lmFit(eset, design)
> cont.matrix <- makeContrasts(WTwyvWTc=WT.WY-WT.Con,
> KOwyvKOc=KO.WY-KO.Con, levels=design)
> fit2 <- contrasts.fit(fit, cont.matrix)
> fit2 <- eBayes(fit2)
>
> ------------------------------------------------ 
> Guido Hooiveld, PhD 
> Nutrition, Metabolism & Genomics Group 
> Division of Human Nutrition 
> Wageningen University 
> Biotechnion, Bomenweg 2 
> NL-6703 HD Wageningen 
> the Netherlands 
> tel: (+)31 317 485788 
> fax: (+)31 317 483342 
> internet:   http://nutrigene.4t.com <http://nutrigene.4t.com/>  
> email:      guido.hooiveld at wur.nl 
>
>
>
> 	[[alternative HTML version deleted]]
>
> _______________________________________________
> Bioconductor mailing list
> Bioconductor at stat.math.ethz.ch
> https://stat.ethz.ch/mailman/listinfo/bioconductor
> Search the archives: http://news.gmane.org/gmane.science.biology.informatics.conductor
>
>   
-- 
Mohamed Lajnef
INSERM Unité 955. 
40 rue de Mesly. 94000 Créteil.
Courriel : Mohamed.lajnef at inserm.fr 
tel. : 01 49 81 31 31 (poste 18470)
Sec : 01 49 81 32 90
fax : 01 49 81 30 99 
    
    
More information about the Bioconductor
mailing list