################################################### ### chunk number 1: ################################################### library(genArise) ################################################### ### chunk number 2: ################################################### data(Simon) ls() ################################################### ### chunk number 3: ################################################### data(Simon) datos <- attr(Simon, "spotData") M <- log(datos$Cy3, 2) - log(datos$Cy5, 2) imageLimma(M, 23, 24, 2, 2) ################################################### ### chunk number 4: ################################################### data(Simon) datos <- attr(Simon, "spotData") R <- log(datos$BgCy3, 2) imageLimma(R, 23, 24, 2, 2, high = "red", low = "white") ################################################### ### chunk number 5: ################################################### data(Simon) datos <- attr(Simon, "spotData") G <- log(datos$BgCy5, 2) imageLimma(G, 23, 24, 2, 2, low = "white", high = "green") ################################################### ### chunk number 6: ################################################### data(Simon) ri.plot(Simon) ################################################### ### chunk number 7: ################################################### data(Simon) ma.plot(Simon) ################################################### ### chunk number 8: ################################################### data(Simon) cys.plot(Simon) ################################################### ### chunk number 9: ################################################### data(Simon) c.spot <- bg.correct(Simon) ri.plot(c.spot) ################################################### ### chunk number 10: ################################################### data(Simon) n.spot <- grid.norm(mySpot = Simon, nr = 23, nc = 24) ri.plot(n.spot) ################################################### ### chunk number 11: ################################################### data(Simon) n.spot <- global.norm(mySpot = Simon) ri.plot(n.spot) ################################################### ### chunk number 12: ################################################### data(Simon) f.spot <- filter.spot(mySpot = Simon) ri.plot(f.spot) ################################################### ### chunk number 13: ################################################### data(Simon) u.spot <- spotUnique(mySpot = Simon) ri.plot(u.spot) ################################################### ### chunk number 14: ################################################### data(Simon) u.spot <- alter.unique(mySpot = Simon) ri.plot(u.spot) ################################################### ### chunk number 15: ################################################### data(Simon) u.spot <- meanUnique(mySpot = Simon) ri.plot(u.spot) ################################################### ### chunk number 16: ################################################### data(WT.dataset) Zscore.plot(WT.dataset, Zscore.min=1)