[BioC] Error in as.vector(x, mode)

James W. MacDonald jmacdon at med.umich.edu
Wed Mar 4 15:23:11 CET 2009


Hi Bharathi,

Ayyarappan Bharathi wrote:
>> eset = justRMA

If this is really the code you are using, the problem is here. Instead 
of computing RMA, you are simply assigning the rma() function to another 
variable, 'eset'. What you want is

eset <- justRMA()

Best,

Jim


>>   library(limma)
>>   targets = readTargets("target.txt")
>> targets
>>   lev <- c("SP","SN")
>>   f <- factor(targets$Targets, levels=lev)
>> design <- model.matrix(~0+f)
>>   colnames(design) <- lev
>>   fit <- lmFit( eset, design)
> Error in as.vector(x, mode) : 
>  cannot coerce type 'closure' to vector of type 'any'
> 
> 
> this is the message i am getting, when i try to work with around 117 cel files.
> Target file and design seems to ok. but still i am getting error message.
> Please some one help regard this.
> Many Thanks
> Bharathi
> 
> 
>       Connect with friends all over the world. Get Yahoo! India Messenger at http://in.messenger.yahoo.com/?wm=n/
> 	[[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

-- 
James W. MacDonald, M.S.
Biostatistician
Douglas Lab
5912 Buhl
1241 E. Catherine St.
Ann Arbor MI 48109-5618
734-615-7826



More information about the Bioconductor mailing list