Entering edit mode
Lee William
▴
10
@lee-william-3875
Last seen 11.3 years ago
Dear All,
I have got microarray data matrix 'yeast' of dimension 22000x600. I
want to
make 50 independent samples of dimension 22000x300 from the original
matrix
'yeast'. And then want to calculate pearsons CC for each of the
obtained 50
matrices. It seems it is possible to do this using 'boot' function
from
library boot but I am not able to figure out how? I have done
following so
far:
cor.fun <- function(data, indices) {data.samp <- data[indices,]
+tmp.cor <- with(data.samp, cor(t(yeast), met="pearson"))
+return(tmp.cor)
+}
>corr.boot <- boot(r, cor.fun, R=50)
Error in eval(substitute(expr), data, enclos = parent.frame()) :
numeric 'envir' arg not of length one
But I am not sure it is serving my purpose.
I am really stuck. Please help!
Best
Lee
[[alternative HTML version deleted]]
