################################################### ### chunk number 1: ################################################### #line 45 "vignettes/les/inst/doc/les.Rnw" set.seed(1) options(width=65, SweaveHooks=list(fig=function() par(mar=c(5.1, 5.1, 2.1, 1.1)))) ################################################### ### chunk number 2: loadData ################################################### #line 99 "vignettes/les/inst/doc/les.Rnw" library(les) data(spikeInData) head(exprs) dim(exprs) pos <- as.integer(rownames(exprs)) condition <- as.integer(colnames(exprs)) reference region <- as.vector(reference[ ,c("start", "end")]) ################################################### ### chunk number 3: estimateProbeLevelStatistics ################################################### #line 116 "vignettes/les/inst/doc/les.Rnw" library(limma) design <- cbind(offset=1, diff=condition) fit <- lmFit(exprs, design) fit <- eBayes(fit) pval <- fit$p.value[, "diff"] ################################################### ### chunk number 4: plotProbeLevelStatistics ################################################### #line 124 "vignettes/les/inst/doc/les.Rnw" plot(pos, pval, pch=20, xlab="Probe position", ylab=expression(p)) abline(v=region) ################################################### ### chunk number 5: constructLes ################################################### #line 163 "vignettes/les/inst/doc/les.Rnw" res <- Les(pos, pval) ################################################### ### chunk number 6: estimateLes ################################################### #line 175 "vignettes/les/inst/doc/les.Rnw" res <- estimate(res, win=200) ################################################### ### chunk number 7: showPlotLes ################################################### #line 184 "vignettes/les/inst/doc/les.Rnw" res summary(res) plot(res) abline(v=region) ################################################### ### chunk number 8: showPlotLes2 ################################################### #line 203 "vignettes/les/inst/doc/les.Rnw" res2 <- estimate(res, win=200, weighting=rectangWeight) res2 plot(res2) abline(v=region) ################################################### ### chunk number 9: threshold ################################################### #line 224 "vignettes/les/inst/doc/les.Rnw" res2 <- threshold(res2, grenander=TRUE, verbose=TRUE) ################################################### ### chunk number 10: regions ################################################### #line 237 "vignettes/les/inst/doc/les.Rnw" res2 <- regions(res2, verbose=TRUE) res2 res2["regions"] ################################################### ### chunk number 11: plotRegions ################################################### #line 243 "vignettes/les/inst/doc/les.Rnw" plot(res2, region=TRUE) abline(v=region) ################################################### ### chunk number 12: plotCi ################################################### #line 263 "vignettes/les/inst/doc/les.Rnw" subset <- pos >= 5232400 & pos <= 5233100 res2 <- ci(res2, subset, nBoot=50, alpha=0.1) plot(res2, error="ci", region=TRUE) ################################################### ### chunk number 13: plotOptions ################################################### #line 287 "vignettes/les/inst/doc/les.Rnw" plot(res2, error="ci", region=TRUE, rug=TRUE, xlim=c(5232000, 5233000), sigArgs=list(col="firebrick4"), plotArgs=list(main="LES results", yaxp=c(0, 1, 2)), limitArgs=list(lty=2, lwd=3), regionArgs=list(col="black", density=20), probeArgs=list(col="dodgerblue4", type="p")) ################################################### ### chunk number 14: export ################################################### #line 307 "vignettes/les/inst/doc/les.Rnw" bedFile <- paste(tempfile(), "bed", sep=".") gffFile <- paste(tempfile(), "gff", sep=".") wigFile <- paste(tempfile(), "wig", sep=".") export(res2, bedFile) export(res2, gffFile, format="gff") export(res2, wigFile, format="wig") ################################################### ### chunk number 15: customWeightingFunction ################################################### #line 329 "vignettes/les/inst/doc/les.Rnw" weightFoo <- function(distance, win) { weight <- 1 - distance/win return(weight) } resFoo <- estimate(res, 200, weighting=weightFoo) ################################################### ### chunk number 16: chi2 eval=FALSE ################################################### ## #line 337 "vignettes/les/inst/doc/les.Rnw" ## regions <- res["regions"] ## winsize <- seq(100, 300, by=20) ## res2 <- chi2(res2, winsize, regions, offset=2500) ## plot(winsize, x["chi2"], type="b") ################################################### ### chunk number 17: sessionInfo ################################################### #line 353 "vignettes/les/inst/doc/les.Rnw" toLatex(sessionInfo(), locale=FALSE)