Entering edit mode
Peevi Ijkl
▴
170
@peevi-ijkl-4360
Last seen 10.4 years ago
Hilist
i need some help regarding meta-analysis.I did the following..
pd <- read.AnnotatedDataFrame( ".txt", header=T, row.names=1, sep=";"
)
pData(pd)
expression_data <- ReadAffy( filenames = rownames (pData(pd)) )
expression_data
rma_expression_data <-rma(expression_data)
rma_data <- exprs(rma_expression_data)
f1 <- function( x ) ( IQR(x) > 0.5 )
ff <- filterfun(f1)
rma_filtered <- genefilter( rma_data, ff )
sum(rma_filtered)
rma_data_selected <- rma_data [ rma_filtered, ]
dim(rma_data)
dim(rma_data_selected)
cl <- as.numeric(pd$Condition == "" )
cl
##multtest
resT <- mt.maxT(rma_data_selected, classlabel=cl, B=2000 )
##Look at the first 10 probesets
resT [1:10 , ]
probe_sets <- rownames(resT) [1:100]
##Select the 1st 100 probsets
resT7561<-resT[1:100,]
resT7561
I tried doing venn mapping on this data,but am getting the following
error
Error in function (classes, fdef, mtable) :
unable to find an inherited method for function "exprs", for
signature
"data.frame"
I really dont know where am I going wrong. Also the meta-analysis
clearly states
that the original dataset is normalized and subsampled. Is there
something am
doing wrong?
Please help
thanks
peevi
[[alternative HTML version deleted]]