[BioC] Problems with affycomp - quantile.default

Markus Schmidberger schmidb at ibe.med.uni-muenchen.de
Wed Aug 8 13:28:18 CEST 2007


Hello,

I want to do some comparison with affycomp and use the affycompII data. 
This is my code

library(affy)
library("affycomp")
path <- "/Microarray/hgu95a-spikein/rawdata"
celFile <- list.celfiles(path=path,full.names=TRUE);
affyBatch <- ReadAffy(filenames=celFile);
eset1 <- rma(affyBatch)
assessFC(eset1,method.name="RMA.2")

and I get the ERROR:
Fehler in quantile.default(m[-spikeindex], prob = probs) :
        missing values and NaN's not allowed if 'na.rm' is FALSE

How to fix this?

R version 2.5.0 (2007-04-23)
i686-pc-linux-gnu
locale:
LC_CTYPE=de_DE.UTF-8;LC_NUMERIC=C;LC_TIME=de_DE.UTF-8;LC_COLLATE=de_DE.UTF-8;LC_MONETARY=de_DE.UTF-8;LC_MESSAGES=de_DE.UTF-8;LC_PAPER=de_DE.UTF-8;LC_NAME=C;LC_ADDRESS=C;LC_TELEPHONE=C;LC_MEASUREMENT=de_DE.UTF-8;LC_IDENTIFICATION=C
attached base packages:
[1] "tools"     "stats"     "graphics"  "grDevices" "utils"     "datasets"
[7] "methods"   "base"    
other attached packages:
hgu95acdf  affycomp      affy    affyio   Biobase
 "1.16.0"  "1.12.0"  "1.14.1"   "1.4.0"  "1.14.0"

Thanks,
Markus

-- 
Dipl.-Tech. Math. Markus Schmidberger

Ludwig-Maximilians-Universität München
IBE - Institut für medizinische Informationsverarbeitung,
Biometrie und Epidemiologie
Marchioninistr. 15, D-81377 Muenchen
URL: http://ibe.web.med.uni-muenchen.de 
Mail: Markus.Schmidberger [at] ibe.med.uni-muenchen.de



More information about the Bioconductor mailing list