################################################### ### chunk number 1: caching ################################################### cache <- function(name, expr) { cachefile <- paste("tmp-", name, ".RData", sep="") if(file.exists(cachefile)) { load(cachefile) } else { assign(name, expr) save(list=name, file=cachefile) } get(name) } ################################################### ### chunk number 2: readaffy eval=FALSE ################################################### ## library("affy") ## Data <- ReadAffy() ################################################### ### chunk number 3: loading ################################################### library("affydata") data(Dilution) ################################################### ### chunk number 4: pm ################################################### pm(Dilution,"1001_at")[1:3,] ################################################### ### chunk number 5: matplot-show eval=FALSE ################################################### ## matplot(pm(Dilution,"1001_at"),type="l", xlab="Probe No.", ## ylab="PM Probe intensity") ## matplot(t(pm(Dilution,"1001_at")),type="l",xlab="Array No.", ## ylab="PM Probe intensity") ################################################### ### chunk number 6: matplot1 ################################################### matplot(pm(Dilution,"1001_at"),type="l",ylab="PM Probe intensity",xlab="Probe No.") ################################################### ### chunk number 7: matplot2 ################################################### matplot(t(pm(Dilution,"1001_at")),type="l",ylab="PM Probe intensity",xlab="Array No.",xaxt="n") axis(1,1:4,1:4) ################################################### ### chunk number 8: pdata ################################################### pData(Dilution) ################################################### ### chunk number 9: showH eval=FALSE ################################################### ## hist(Dilution) ## boxplot(Dilution) ################################################### ### chunk number 10: hist ################################################### hist(Dilution) ################################################### ### chunk number 11: boxplot ################################################### boxplot(Dilution) ################################################### ### chunk number 12: rma.bg.show eval=FALSE ################################################### ## Dilution.bg.rma <- bg.correct(Dilution, method="rma") ################################################### ### chunk number 13: mas5.bg.show eval=FALSE ################################################### ## Dilution.bg.mas <- bg.correct(Dilution,method="mas") ################################################### ### chunk number 14: mas5.norm eval=FALSE ################################################### ## Dilution.norm.scale <- normalize(Dilution, ## method="constant") ################################################### ### chunk number 15: invariantset.norm.show eval=FALSE ################################################### ## Dilution.norm.nonlinear <- normalize(Dilution, ## method="invariantset") ################################################### ### chunk number 16: quantile.norm eval=FALSE ################################################### ## Dilution.norm.quantile <- normalize(Dilution, ## method="quantiles") ################################################### ### chunk number 17: loess.norm.show eval=FALSE ################################################### ## Dilution.norm.loess <- normalize(Dilution, ## method="loess") ################################################### ### chunk number 18: vsn.norm eval=FALSE ################################################### ## library("vsn") ## Dil.vsn <- normalize(Dilution, method = "vsn") ################################################### ### chunk number 19: normalizemethods ################################################### normalize.methods(Dilution) ################################################### ### chunk number 20: