The bumphunter package can be used for methylation analyses where you are interested in identifying differentially methylated regions. The vignette explains in greater detail the data set we are using in this example.
## Load bumphunter
library('bumphunter')
## Loading required package: S4Vectors
## Loading required package: stats4
## Loading required package: BiocGenerics
## Loading required package: parallel
##
## Attaching package: 'BiocGenerics'
## The following objects are masked from 'package:parallel':
##
## clusterApply, clusterApplyLB, clusterCall, clusterEvalQ,
## clusterExport, clusterMap, parApply, parCapply, parLapply,
## parLapplyLB, parRapply, parSapply, parSapplyLB
## The following objects are masked from 'package:stats':
##
## IQR, mad, xtabs
## The following objects are masked from 'package:base':
##
## Filter, Find, Map, Position, Reduce, anyDuplicated, append,
## as.data.frame, cbind, colnames, do.call, duplicated, eval,
## evalq, get, grep, grepl, intersect, is.unsorted, lapply,
## lengths, mapply, match, mget, order, paste, pmax, pmax.int,
## pmin, pmin.int, rank, rbind, rownames, sapply, setdiff, sort,
## table, tapply, union, unique, unsplit
##
## Attaching package: 'S4Vectors'
## The following objects are masked from 'package:base':
##
## colMeans, colSums, expand.grid, rowMeans, rowSums
## Loading required package: IRanges
## Loading required package: GenomeInfoDb
## Loading required package: GenomicRanges
## Loading required package: foreach
## Loading required package: iterators
## Loading required package: locfit
## locfit 1.5-9.1 2013-03-22
## Create data from the vignette
pos <- list(pos1=seq(1, 1000, 35),
pos2=seq(2001, 3000, 35),
pos3=seq(1, 1000, 50))
chr <- rep(paste0('chr', c(1, 1, 2)), times = sapply(pos, length))
pos <- unlist(pos, use.names = FALSE)
## Find clusters
cl <- clusterMaker(chr, pos, maxGap = 300)
## Build simulated bumps
Indexes <- split(seq_along(cl), cl)
beta1 <- rep(0, length(pos))
for(i in seq(along=Indexes)){
ind <- Indexes[[i]]
x <- pos[ind]
z <- scale(x, median(x), max(x)/12)
beta1[ind] <- i*(-1)^(i+1)*pmax(1-abs(z)^3,0)^3 ##multiply by i to vary size
}
## Build data
beta0 <- 3 * sin(2 * pi * pos / 720)
X <- cbind(rep(1, 20), rep(c(0, 1), each = 10))
set.seed(23852577)
error <- matrix(rnorm(20 * length(beta1), 0, 1), ncol = 20)
y <- t(X[, 1]) %x% beta0 + t(X[, 2]) %x% beta1 + error
## Perform bumphunting
tab <- bumphunter(y, X, chr, pos, cl, cutoff=.5)
## [bumphunterEngine] Using a single core (backend: doSEQ, version: 1.4.3).
## [bumphunterEngine] Computing coefficients.
## [bumphunterEngine] Finding regions.
## [bumphunterEngine] Found 15 bumps.
## Explore data
lapply(tab, head)
## $table
## chr start end value area cluster indexStart indexEnd L
## 10 chr1 2316 2631 -1.5814747 15.8147473 2 39 48 10
## 7 chr2 451 551 1.5891293 4.7673878 3 68 70 3
## 2 chr1 456 526 1.0678828 3.2036485 1 14 16 3
## 5 chr1 2176 2211 0.7841794 1.5683589 2 35 36 2
## 6 chr1 2841 2841 1.2010184 1.2010184 2 54 54 1
## 4 chr1 771 771 0.7780902 0.7780902 1 23 23 1
## clusterL
## 10 29
## 7 20
## 2 29
## 5 29
## 6 29
## 4 29
##
## $coef
## [,1]
## [1,] 0.60960932
## [2,] -0.09052769
## [3,] -0.21482638
## [4,] 0.13053755
## [5,] -0.21723642
## [6,] 0.39934961
##
## $fitted
## [,1]
## [1,] 0.60960932
## [2,] -0.09052769
## [3,] -0.21482638
## [4,] 0.13053755
## [5,] -0.21723642
## [6,] 0.39934961
##
## $pvaluesMarginal
## [1] NA
Once we have the regions we can proceed to build the required GRanges
object.
library('GenomicRanges')
## Build GRanges with sequence lengths
regions <- GRanges(seqnames = tab$table$chr,
IRanges(start = tab$table$start, end = tab$table$end),
strand = '*', value = tab$table$value, area = tab$table$area,
cluster = tab$table$cluster, L = tab$table$L, clusterL = tab$table$clusterL)
## Assign chr lengths
data(hg19Ideogram, package = 'biovizBase')
seqlengths(regions) <- seqlengths(hg19Ideogram)[names(seqlengths(regions))]
## Explore the regions
regions
## GRanges object with 15 ranges and 5 metadata columns:
## seqnames ranges strand | value area
## <Rle> <IRanges> <Rle> | <numeric> <numeric>
## [1] chr1 [2316, 2631] * | -1.58147472668612 15.8147472668612
## [2] chr2 [ 451, 551] * | 1.58912926544627 4.76738779633882
## [3] chr1 [ 456, 526] * | 1.06788283103948 3.20364849311844
## [4] chr1 [2176, 2211] * | 0.784179442360784 1.56835888472157
## [5] chr1 [2841, 2841] * | 1.20101842543356 1.20101842543356
## ... ... ... ... . ... ...
## [11] chr1 [ 631, 631] * | 0.618602646982714 0.618602646982714
## [12] chr1 [ 1, 1] * | 0.609609318450113 0.609609318450113
## [13] chr1 [2911, 2911] * | -0.576423040796044 0.576423040796044
## [14] chr2 [ 251, 251] * | -0.556159535339166 0.556159535339166
## [15] chr1 [2806, 2806] * | -0.521605772372843 0.521605772372843
## cluster L clusterL
## <numeric> <numeric> <integer>
## [1] 2 10 29
## [2] 3 3 20
## [3] 1 3 29
## [4] 2 2 29
## [5] 2 1 29
## ... ... ... ...
## [11] 1 1 29
## [12] 1 1 29
## [13] 2 1 29
## [14] 3 1 20
## [15] 2 1 29
## -------
## seqinfo: 2 sequences from an unspecified genome
Now that we have identified a set of differentially methylated regions we can proceed to creating the HTML report. Note that this report has less information than the DiffBind example because we don’t have a p-value variable.
## Load regionReport
library('regionReport')
## Make it so that the report will be available as a vignette
original <- readLines(system.file('regionExploration', 'regionExploration.Rmd',
package = 'regionReport'))
vignetteInfo <- c(
'vignette: >',
' %\\VignetteEngine{knitr::rmarkdown}',
' %\\VignetteIndexEntry{Basic genomic regions exploration}',
' %\\VignetteEncoding{UTF-8}'
)
new <- c(original[1:12], vignetteInfo, original[13:length(original)])
writeLines(new, 'regionReportBumphunter.Rmd')
## Now create the report
report <- renderReport(regions, 'Example bumphunter', pvalueVars = NULL,
densityVars = c('Area' = 'area', 'Value' = 'value',
'Cluster Length' = 'clusterL'), significantVar = NULL,
output = 'bumphunterExampleOutput', outdir = '.',
template = 'regionReportBumphunter.Rmd', device = 'png')
## Warning: replacing previous import 'ggplot2::Position' by
## 'BiocGenerics::Position' when loading 'ggbio'
## Writing 11 Bibtex entries ...
## OK
## Results written to file './bumphunterExampleOutput.bib'
## processing file: bumphunterExampleOutput.Rmd
## No annotationPackage supplied. Trying org.Hs.eg.db.
## Loading required package: org.Hs.eg.db
##
## Getting TSS and TSE.
## Getting CSS and CSE.
## Getting exons.
## Annotating genes.
## Scale for 'x' is already present. Adding another scale for 'x', which
## will replace the existing scale.
## output file: bumphunterExampleOutput.knit.md
## /usr/bin/pandoc +RTS -K512m -RTS bumphunterExampleOutput.utf8.md --to html --from markdown+autolink_bare_uris+ascii_identifiers+tex_math_single_backslash --output bumphunterExampleOutput.html --smart --email-obfuscation none --self-contained --standalone --section-divs --variable toc_float=1 --variable toc_selectors=h1,h2,h3 --variable toc_collapsed=1 --variable toc_smooth_scroll=1 --table-of-contents --toc-depth 3 --template /home/biocbuild/bbs-3.3-bioc/R/library/rmarkdown/rmd/h/default.html --variable 'theme:spacelab' --include-in-header /tmp/RtmpXf69kV/rmarkdown-str7fb71d502eca.html --mathjax --variable 'mathjax-url:https://cdn.mathjax.org/mathjax/latest/MathJax.js?config=TeX-AMS-MML_HTMLorMML' --no-highlight --variable highlightjs=/home/biocbuild/bbs-3.3-bioc/R/library/rmarkdown/rmd/h/highlight --variable navigationjs=/home/biocbuild/bbs-3.3-bioc/R/library/rmarkdown/rmd/h/navigation-1.0 --variable code_folding=hide
##
## Output created: bumphunterExampleOutput.html
## Clean up
file.remove('regionReportBumphunter.Rmd')
## [1] TRUE
You can view the final report here.
In case the link does not work, a pre-compiled version of this document and its corresponding report are available at leekgroup.github.io/regionReportSupp/.
## Date generated:
Sys.time()
## [1] "2016-05-15 21:56:25 PDT"
## Time spent making this page:
proc.time()
## user system elapsed
## 125.367 0.799 126.592
## R and packages info:
options(width = 120)
devtools::session_info()
## Session info -----------------------------------------------------------------------------------------------------------
## setting value
## version R version 3.3.0 (2016-05-03)
## system x86_64, linux-gnu
## ui X11
## language en_US:
## collate C
## tz <NA>
## date 2016-05-15
## Packages ---------------------------------------------------------------------------------------------------------------
## package * version date source
## AnnotationDbi * 1.34.2 2016-05-16 Bioconductor
## AnnotationHub 2.4.2 2016-05-16 Bioconductor
## BSgenome 1.40.0 2016-05-16 Bioconductor
## Biobase * 2.32.0 2016-05-16 Bioconductor
## BiocGenerics * 0.18.0 2016-05-16 Bioconductor
## BiocInstaller 1.22.2 2016-05-16 Bioconductor
## BiocParallel 1.6.2 2016-05-16 Bioconductor
## BiocStyle * 2.0.2 2016-05-16 Bioconductor
## Biostrings 2.40.0 2016-05-16 Bioconductor
## DBI 0.4-1 2016-05-08 CRAN (R 3.3.0)
## DEFormats 1.0.2 2016-05-16 Bioconductor
## DESeq2 1.12.2 2016-05-16 Bioconductor
## DT * 0.1 2015-06-09 CRAN (R 3.3.0)
## Formula 1.2-1 2015-04-07 CRAN (R 3.3.0)
## GGally 1.0.1 2016-01-14 CRAN (R 3.3.0)
## GenomeInfoDb * 1.8.2 2016-05-16 Bioconductor
## GenomicAlignments 1.8.0 2016-05-16 Bioconductor
## GenomicFeatures * 1.24.2 2016-05-16 Bioconductor
## GenomicFiles 1.8.0 2016-05-16 Bioconductor
## GenomicRanges * 1.24.0 2016-05-16 Bioconductor
## Hmisc 3.17-4 2016-05-02 CRAN (R 3.3.0)
## IRanges * 2.6.0 2016-05-16 Bioconductor
## Matrix 1.2-6 2016-05-02 CRAN (R 3.3.0)
## OrganismDbi 1.14.0 2016-05-16 Bioconductor
## R6 2.1.2 2016-01-26 CRAN (R 3.3.0)
## RBGL 1.48.0 2016-05-16 Bioconductor
## RColorBrewer * 1.1-2 2014-12-07 CRAN (R 3.3.0)
## RCurl 1.95-4.8 2016-03-01 CRAN (R 3.3.0)
## RJSONIO 1.3-0 2014-07-28 CRAN (R 3.3.0)
## RSQLite 1.0.0 2014-10-25 CRAN (R 3.3.0)
## Rcpp 0.12.5 2016-05-14 CRAN (R 3.3.0)
## RefManageR 0.10.13 2016-04-04 CRAN (R 3.3.0)
## Rsamtools 1.24.0 2016-05-16 Bioconductor
## S4Vectors * 0.10.0 2016-05-16 Bioconductor
## SummarizedExperiment 1.2.2 2016-05-16 Bioconductor
## TxDb.Hsapiens.UCSC.hg19.knownGene * 3.2.2 2016-05-04 Bioconductor
## VariantAnnotation 1.18.1 2016-05-16 Bioconductor
## XML 3.98-1.4 2016-03-01 CRAN (R 3.3.0)
## XVector 0.12.0 2016-05-16 Bioconductor
## acepack 1.3-3.3 2014-11-24 CRAN (R 3.3.0)
## annotate 1.50.0 2016-05-16 Bioconductor
## backports 1.0.2 2016-03-18 CRAN (R 3.3.0)
## bibtex 0.4.0 2014-12-31 CRAN (R 3.3.0)
## biomaRt 2.28.0 2016-05-16 Bioconductor
## biovizBase 1.20.0 2016-05-16 Bioconductor
## bitops 1.0-6 2013-08-17 CRAN (R 3.3.0)
## bumphunter * 1.12.0 2016-05-16 Bioconductor
## checkmate 1.7.4 2016-04-08 CRAN (R 3.3.0)
## chron 2.3-47 2015-06-24 CRAN (R 3.3.0)
## cluster 2.0.4 2016-04-18 CRAN (R 3.3.0)
## codetools 0.2-14 2015-07-15 CRAN (R 3.3.0)
## colorspace 1.2-6 2015-03-11 CRAN (R 3.3.0)
## data.table 1.9.6 2015-09-19 CRAN (R 3.3.0)
## derfinder * 1.6.4 2016-05-16 Bioconductor
## derfinderHelper 1.6.3 2016-05-16 Bioconductor
## derfinderPlot * 1.6.3 2016-05-16 Bioconductor
## devtools * 1.11.1 2016-04-21 CRAN (R 3.3.0)
## dichromat 2.0-0 2013-01-24 CRAN (R 3.3.0)
## digest 0.6.9 2016-01-08 CRAN (R 3.3.0)
## doRNG 1.6 2014-03-07 CRAN (R 3.3.0)
## edgeR 3.14.0 2016-05-16 Bioconductor
## ensembldb 1.4.2 2016-05-16 Bioconductor
## evaluate 0.9 2016-04-29 CRAN (R 3.3.0)
## foreach * 1.4.3 2015-10-13 CRAN (R 3.3.0)
## foreign 0.8-66 2015-08-19 CRAN (R 3.3.0)
## formatR 1.4 2016-05-09 CRAN (R 3.3.0)
## genefilter 1.54.2 2016-05-16 Bioconductor
## geneplotter 1.50.0 2016-05-16 Bioconductor
## ggbio * 1.20.1 2016-05-16 Bioconductor
## ggplot2 * 2.1.0 2016-03-01 CRAN (R 3.3.0)
## graph 1.50.0 2016-05-16 Bioconductor
## gridExtra * 2.2.1 2016-02-29 CRAN (R 3.3.0)
## gtable 0.2.0 2016-02-26 CRAN (R 3.3.0)
## highr 0.6 2016-05-09 CRAN (R 3.3.0)
## htmltools 0.3.5 2016-03-21 CRAN (R 3.3.0)
## htmlwidgets 0.6 2016-02-25 CRAN (R 3.3.0)
## httpuv 1.3.3 2015-08-04 CRAN (R 3.3.0)
## httr 1.1.0 2016-01-28 CRAN (R 3.3.0)
## interactiveDisplayBase 1.10.3 2016-05-16 Bioconductor
## iterators * 1.0.8 2015-10-13 CRAN (R 3.3.0)
## jsonlite 0.9.20 2016-05-10 CRAN (R 3.3.0)
## knitcitations 1.0.7 2015-10-28 CRAN (R 3.3.0)
## knitr * 1.13 2016-05-09 CRAN (R 3.3.0)
## knitrBootstrap 1.0.0 2015-12-16 CRAN (R 3.3.0)
## labeling 0.3 2014-08-23 CRAN (R 3.3.0)
## lattice 0.20-33 2015-07-14 CRAN (R 3.3.0)
## latticeExtra 0.6-28 2016-02-09 CRAN (R 3.3.0)
## limma 3.28.4 2016-05-16 Bioconductor
## locfit * 1.5-9.1 2013-04-20 CRAN (R 3.3.0)
## lubridate 1.5.6 2016-04-06 CRAN (R 3.3.0)
## magrittr 1.5 2014-11-22 CRAN (R 3.3.0)
## markdown 0.7.7 2015-04-22 CRAN (R 3.3.0)
## matrixStats 0.50.2 2016-04-24 CRAN (R 3.3.0)
## memoise 1.0.0 2016-01-29 CRAN (R 3.3.0)
## mgcv * 1.8-12 2016-03-03 CRAN (R 3.3.0)
## mime 0.4 2015-09-03 CRAN (R 3.3.0)
## munsell 0.4.3 2016-02-13 CRAN (R 3.3.0)
## nlme * 3.1-128 2016-05-10 CRAN (R 3.3.0)
## nnet 7.3-12 2016-02-02 CRAN (R 3.3.0)
## org.Hs.eg.db * 3.3.0 2016-05-04 Bioconductor
## pkgmaker 0.22 2014-05-14 CRAN (R 3.3.0)
## plyr 1.8.3 2015-06-12 CRAN (R 3.3.0)
## qvalue 2.4.2 2016-05-16 Bioconductor
## regionReport * 1.6.5 2016-05-16 Bioconductor
## registry 0.3 2015-07-08 CRAN (R 3.3.0)
## reshape 0.8.5 2014-04-23 CRAN (R 3.3.0)
## reshape2 1.4.1 2014-12-06 CRAN (R 3.3.0)
## rmarkdown 0.9.6 2016-05-01 CRAN (R 3.3.0)
## rngtools 1.2.4 2014-03-06 CRAN (R 3.3.0)
## rpart 4.1-10 2015-06-29 CRAN (R 3.3.0)
## rstudioapi 0.5 2016-01-24 CRAN (R 3.3.0)
## rtracklayer 1.32.0 2016-05-16 Bioconductor
## scales 0.4.0 2016-02-26 CRAN (R 3.3.0)
## shiny 0.13.2 2016-03-28 CRAN (R 3.3.0)
## stringi 1.0-1 2015-10-22 CRAN (R 3.3.0)
## stringr 1.0.0 2015-04-30 CRAN (R 3.3.0)
## survival 2.39-4 2016-05-11 CRAN (R 3.3.0)
## whisker * 0.3-2 2013-04-28 CRAN (R 3.3.0)
## withr 1.0.1.9000 2016-05-05 Github (jimhester/withr@bd42181)
## xtable 1.8-2 2016-02-05 CRAN (R 3.3.0)
## yaml 2.1.13 2014-06-12 CRAN (R 3.3.0)
## zlibbioc 1.18.0 2016-05-16 Bioconductor