[BioC] RefPlus error
Christian Ruckert
cruckert at uni-muenster.de
Thu Feb 19 17:57:35 CET 2009
When using the rmaplus function from RefPlus package with only one
sample in the AffyBatch object I get the following error message:
Error in dimnames(x) <- dn :
length of 'dimnames' [2] not equal to array extent
The problem lies somewhere in function rmaref.predict, in the line:
colnames(future)<-sampleNames(Future)
where future has its dimensions switched.
"rmaref.predict" <- function(Future,p.e){
## Derive RMA+ expression.
PMindex<-pmindex(Future)
PM<-log2(pm(Future))
PM<-sweep(PM,1,unlist(p.e))
pm(Future)<-PM
PMlist<-lapply(PMindex,function(x,y) intensity(y)[x,],Future)
future<-t(sapply(PMlist,colMedians))
colnames(future)<-sampleNames(Future)
return(future)
}
Greetings,
Christian
More information about the Bioconductor
mailing list