1 Basic genomic regions exploration

Project: Example bumphunter.

2 Introduction

This report is meant to help explore a set of genomic regions and was generated using the regionReport (Collado-Torres, Jaffe, and Leek, 2016) package. While the report is rich, it is meant to just start the exploration of the results and exemplify some of the code used to do so. If you need a more in-depth analysis for your specific data set you might want to use the customCode argument.

Most plots were made with using ggplot2 (Wickham, 2016).

2.1 Code setup

## knitrBoostrap and device chunk options
library('knitr')
opts_chunk$set(bootstrap.show.code = FALSE, dev = device)
if(!outputIsHTML) opts_chunk$set(bootstrap.show.code = FALSE, dev = device, echo = FALSE)
#### Libraries needed

## Bioconductor
library('bumphunter')
library('derfinder')
library('derfinderPlot')
library('GenomeInfoDb')
library('GenomicRanges')
library('ggbio')
## Loading required package: ggplot2
## Need specific help about ggbio? try mailing 
##  the maintainer or visit http://tengfei.github.com/ggbio/
## 
## Attaching package: 'ggbio'
## The following objects are masked from 'package:ggplot2':
## 
##     geom_bar, geom_rect, geom_segment, ggsave, stat_bin,
##     stat_identity, xlim
## Transcription database to use by default
if(is.null(txdb)) {
    library('TxDb.Hsapiens.UCSC.hg19.knownGene')
    txdb <- TxDb.Hsapiens.UCSC.hg19.knownGene::TxDb.Hsapiens.UCSC.hg19.knownGene
}
## Loading required package: GenomicFeatures
## Loading required package: AnnotationDbi
## Loading required package: Biobase
## Welcome to Bioconductor
## 
##     Vignettes contain introductory material; view with
##     'browseVignettes()'. To cite Bioconductor, see
##     'citation("Biobase")', and for packages 'citation("pkgname")'.
## CRAN
library('ggplot2')
if(!is.null(theme)) theme_set(theme)
library('grid')
library('gridExtra')
## 
## Attaching package: 'gridExtra'
## The following object is masked from 'package:Biobase':
## 
##     combine
## The following object is masked from 'package:BiocGenerics':
## 
##     combine
library('knitr')
library('RColorBrewer')
library('mgcv')
## Loading required package: nlme
## 
## Attaching package: 'nlme'
## The following object is masked from 'package:IRanges':
## 
##     collapse
## This is mgcv 1.8-28. For overview type 'help("mgcv-package")'.
library('whisker')
library('DT')
library('sessioninfo')

#### Code setup

## For ggplot
tmp <- regions
names(tmp) <- seq_len(length(tmp))
regions.df <- as.data.frame(tmp)
regions.df$width <- width(tmp)
rm(tmp)

## Special subsets: need at least 3 points for a density plot
keepChr <- table(regions.df$seqnames) > 2
regions.df.plot <- subset(regions.df, seqnames %in% names(keepChr[keepChr]))

if(hasSignificant) {
    ## Keep only those sig
    regions.df.sig <- regions.df[significantVar, ]
    keepChr <- table(regions.df.sig$seqnames) > 2
    regions.df.sig <- subset(regions.df.sig, seqnames %in% names(keepChr[keepChr]))
}

## Find which chrs are present in the data set
chrs <- levels(seqnames(regions))

## areaVar initialize
areaVar <- NULL

3 Quality checks

3.1 Region width

p2a <- ggplot(regions.df.plot, aes(x=log10(width), colour=seqnames)) +
    geom_line(stat='density') + labs(title='Density of region lengths') +
    xlab('Region width (log10)') + scale_colour_discrete(limits=chrs) +
    theme(legend.title=element_blank())
p2a

This plot shows the density of the region lengths for all regions.

for(i in seq_len(length(densityVars))) {
    densityVarName <- names(densityVars[i])
    densityVarName <- ifelse(is.null(densityVarName), densityVars[i], densityVarName)
   cat(knit_child(text = whisker.render(templateDensityInUse, list(varName = densityVars[i], densityVarName = densityVarName)), quiet = TRUE), sep = '\n')
}

3.2 Area

p3aarea <- ggplot(regions.df.plot[is.finite(regions.df.plot[, 'area']), ], aes(x=area, colour=seqnames)) +
    geom_line(stat='density') + labs(title='Density of Area') +
    xlab('Area') + scale_colour_discrete(limits=chrs) +
    theme(legend.title=element_blank())
p3aarea

This plot shows the density of the Area for all regions.

3.3 Value

p3avalue <- ggplot(regions.df.plot[is.finite(regions.df.plot[, 'value']), ], aes(x=value, colour=seqnames)) +
    geom_line(stat='density') + labs(title='Density of Value') +
    xlab('Value') + scale_colour_discrete(limits=chrs) +
    theme(legend.title=element_blank())
p3avalue

This plot shows the density of the Value for all regions.

3.4 Cluster Length

p3aclusterL <- ggplot(regions.df.plot[is.finite(regions.df.plot[, 'clusterL']), ], aes(x=clusterL, colour=seqnames)) +
    geom_line(stat='density') + labs(title='Density of Cluster Length') +
    xlab('Cluster Length') + scale_colour_discrete(limits=chrs) +
    theme(legend.title=element_blank())
p3aclusterL

This plot shows the density of the Cluster Length for all regions.

4 Genomic overview

The following plots were made using ggbio (Yin, Cook, and Lawrence, 2012) which in turn uses ggplot2 (Wickham, 2016). For more details check plotOverview in derfinderPlot (Collado-Torres, Jaffe, and Leek, 2017).

4.1 P-values

This plot shows the genomic locations of the regions found in the analysis. The significant regions are highlighted and the of the regions is shown on top of each chromosome (skipped because there was no applicable variable).

4.2 Annotation

## Annotate regions with bumphunter
if(is.null(annotation)) {
    genes <- annotateTranscripts(txdb = txdb)
    annotation <- matchGenes(x = regions, subject = genes)
}


## Make the plot
plotOverview(regions=regions, annotation=annotation, type='annotation', base_size=overviewParams$base_size, areaRel=overviewParams$areaRel, legend.position=c(0.97, 0.12))

This genomic overview plot shows the annotation region type for the regions as determined using bumphunter (Jaffe, Murakami, Lee, Leek, et al., 2012). Note that the regions are shown only if the annotation information is available. Below is a table of the actual number of results per annotation region type.

annoReg <- table(annotation$region, useNA='always')
annoReg.df <- data.frame(Region=names(annoReg), Count=as.vector(annoReg))
if(outputIsHTML) {
    kable(annoReg.df, format = 'markdown', align=rep('c', 3))
} else {
    kable(annoReg.df)
}
Region Count
upstream 10
promoter 0
overlaps 5’ 0
inside 0
overlaps 3’ 0
close to 3’ 0
downstream 5
covers 0
NA 0

4.3 Annotation (significant)

This genomic overview plot shows the annotation region type for the statistically significant regions. Note that the regions are shown only if the annotation information is available. Plot skipped because there are no significant regions.

5 Best regions

5.1 Genomic states

Below is a table summarizing the number of genomic states per region as determined using derfinder (Collado-Torres, Nellore, Frazee, Wilks, et al., 2017).

## Construct genomic state object
genomicState <- makeGenomicState(txdb = txdb, chrs = chrs, verbose = FALSE)
## 'select()' returned 1:1 mapping between keys and columns
## Annotate regions by genomic state
annotatedRegions <- annotateRegions(regions, genomicState$fullGenome, verbose = FALSE)

## Genomic states table
info <- do.call(rbind, lapply(annotatedRegions$countTable, function(x) { data.frame(table(x)) }))
colnames(info) <- c('Number of Overlapping States', 'Frequency')
info$State <- gsub('\\..*', '', rownames(info))
rownames(info) <- NULL
if(outputIsHTML) {
    kable(info, format = 'markdown', align=rep('c', 4))
} else {
    kable(info)
}
Number of Overlapping States Frequency State
0 15 exon
1 15 intergenic
0 15 intron

The following is a venn diagram showing how many regions overlap known exons, introns, and intergenic segments, none of them, or multiple of these groups.

## Venn diagram for all regions
venn <- vennRegions(annotatedRegions, counts.col = 'blue', 
    main = 'Regions overlapping genomic states')

5.2 Region information

Below is an interactive table with the top 15 regions (out of 15) as ranked by p-value without ranking because no p-value information was provided. Inf and -Inf are shown as 1e100 and -1e100 respectively. Use the search function to find your region of interest or sort by one of the columns.

## Add annotation information
regions.df <- cbind(regions.df, annotation)

## Rank by p-value (first pvalue variable supplied)
if(hasPvalueVars){
    topRegions <- head(regions.df[order(regions.df[, pvalueVars[1]], 
        decreasing = FALSE), ], nBestRegions)
    topRegions <- cbind(data.frame('pvalueRank' = seq_len(nrow(topRegions))), 
        topRegions)
} else {
    topRegions <- head(regions.df, nBestRegions)
}

## Clean up -Inf, Inf if present
## More details at https://github.com/ramnathv/rCharts/issues/259
replaceInf <- function(df, colsubset=seq_len(ncol(df))) {
    for(i in colsubset) {
        inf.idx <- !is.finite(df[, i])
        if(any(inf.idx)) {
            inf.sign <- sign(df[inf.idx, i])
            df[inf.idx, i] <- inf.sign * 1e100
        }
    }
    return(df)
}
topRegions <- replaceInf(topRegions, which(sapply(topRegions, function(x) {
    class(x) %in% c('numeric', 'integer')})))

## Make the table
greptext <- 'value$|area$|mean|log2FoldChange'
greppval <- 'pvalues$|qvalues$|fwer$'
if(hasPvalueVars) {
    greppval <- paste0(paste(pvalueVars, collapse = '$|'), '$|', greppval)
}
if(hasDensityVars) {
    greptext <- paste0(paste(densityVars, collapse = '$|'), '$|', greptext)
}

for(i in which(grepl(greppval, colnames(topRegions)))) topRegions[, i] <- format(topRegions[, i], scientific = TRUE)

if(outputIsHTML) {
    datatable(topRegions, options = list(pagingType='full_numbers', pageLength=10, scrollX='100%'), rownames = FALSE) %>% formatRound(which(grepl(greptext, colnames(topRegions))), digits)
} else {
    ## Only print the top part if your output is a PDF file
    df_top <- head(topRegions, 20)
    for(i in which(grepl(greptext, colnames(topRegions)))) df_top[, i] <- round(df_top[, i], digits)
    kable(df_top)
}

6 Reproducibility

This report was generated in path /tmp/RtmpkOavtq/Rbuild17bd7bc869ce/regionReport/vignettes using the following call to renderReport():

## renderReport(regions = regions, project = "Example bumphunter", 
##     pvalueVars = NULL, densityVars = c(Area = "area", Value = "value", 
##         `Cluster Length` = "clusterL"), significantVar = NULL, 
##     outdir = ".", output = "bumphunterExampleOutput", device = "png", 
##     template = "regionReportBumphunter.Rmd")

Date the report was generated.

## [1] "2019-06-18 21:06:30 EDT"

Wallclock time spent generating the report.

## Time difference of 1.911 mins

R session information.

## ─ Session info ───────────────────────────────────────────────────────────────────────────────────────────────────────
##  setting  value                       
##  version  R version 3.6.0 (2019-04-26)
##  os       Ubuntu 18.04.2 LTS          
##  system   x86_64, linux-gnu           
##  ui       X11                         
##  language (EN)                        
##  collate  C                           
##  ctype    en_US.UTF-8                 
##  tz       America/New_York            
##  date     2019-06-18                  
## 
## ─ Packages ───────────────────────────────────────────────────────────────────────────────────────────────────────────
##  package                           * version   date       lib source        
##  acepack                             1.4.1     2016-10-29 [2] CRAN (R 3.6.0)
##  annotate                            1.62.0    2019-06-18 [2] Bioconductor  
##  AnnotationDbi                     * 1.46.0    2019-06-18 [2] Bioconductor  
##  AnnotationFilter                    1.8.0     2019-06-18 [2] Bioconductor  
##  assertthat                          0.2.1     2019-03-21 [2] CRAN (R 3.6.0)
##  backports                           1.1.4     2019-04-10 [2] CRAN (R 3.6.0)
##  base64enc                           0.1-3     2015-07-28 [2] CRAN (R 3.6.0)
##  bibtex                              0.4.2     2017-06-30 [2] CRAN (R 3.6.0)
##  Biobase                           * 2.44.0    2019-06-18 [2] Bioconductor  
##  BiocGenerics                      * 0.30.0    2019-06-18 [2] Bioconductor  
##  BiocManager                         1.30.4    2018-11-13 [2] CRAN (R 3.6.0)
##  BiocParallel                        1.18.0    2019-06-18 [2] Bioconductor  
##  BiocStyle                         * 2.12.0    2019-06-18 [2] Bioconductor  
##  biomaRt                             2.40.0    2019-06-18 [2] Bioconductor  
##  Biostrings                          2.52.0    2019-06-18 [2] Bioconductor  
##  biovizBase                          1.32.0    2019-06-18 [2] Bioconductor  
##  bit                                 1.1-14    2018-05-29 [2] CRAN (R 3.6.0)
##  bit64                               0.9-7     2017-05-08 [2] CRAN (R 3.6.0)
##  bitops                              1.0-6     2013-08-17 [2] CRAN (R 3.6.0)
##  blob                                1.1.1     2018-03-25 [2] CRAN (R 3.6.0)
##  bookdown                            0.11      2019-05-28 [2] CRAN (R 3.6.0)
##  BSgenome                            1.52.0    2019-06-18 [2] Bioconductor  
##  bumphunter                        * 1.26.0    2019-06-18 [2] Bioconductor  
##  checkmate                           1.9.3     2019-05-03 [2] CRAN (R 3.6.0)
##  cli                                 1.1.0     2019-03-19 [2] CRAN (R 3.6.0)
##  cluster                             2.0.9     2019-05-01 [2] CRAN (R 3.6.0)
##  codetools                           0.2-16    2018-12-24 [2] CRAN (R 3.6.0)
##  colorspace                          1.4-1     2019-03-18 [2] CRAN (R 3.6.0)
##  crayon                              1.3.4     2017-09-16 [2] CRAN (R 3.6.0)
##  crosstalk                           1.0.0     2016-12-21 [2] CRAN (R 3.6.0)
##  curl                                3.3       2019-01-10 [2] CRAN (R 3.6.0)
##  data.table                          1.12.2    2019-04-07 [2] CRAN (R 3.6.0)
##  DBI                                 1.0.0     2018-05-02 [2] CRAN (R 3.6.0)
##  DEFormats                           1.12.0    2019-06-18 [2] Bioconductor  
##  DelayedArray                        0.10.0    2019-06-18 [2] Bioconductor  
##  derfinder                         * 1.18.3    2019-06-18 [2] Bioconductor  
##  derfinderHelper                     1.18.1    2019-06-18 [2] Bioconductor  
##  derfinderPlot                     * 1.18.1    2019-06-18 [2] Bioconductor  
##  DESeq2                              1.24.0    2019-06-18 [2] Bioconductor  
##  dichromat                           2.0-0     2013-01-24 [2] CRAN (R 3.6.0)
##  digest                              0.6.19    2019-05-20 [2] CRAN (R 3.6.0)
##  doRNG                               1.7.1     2018-06-22 [2] CRAN (R 3.6.0)
##  dplyr                               0.8.1     2019-05-14 [2] CRAN (R 3.6.0)
##  DT                                * 0.7       2019-06-11 [2] CRAN (R 3.6.0)
##  edgeR                               3.26.4    2019-06-18 [2] Bioconductor  
##  ensembldb                           2.8.0     2019-06-18 [2] Bioconductor  
##  evaluate                            0.14      2019-05-28 [2] CRAN (R 3.6.0)
##  foreach                           * 1.4.4     2017-12-12 [2] CRAN (R 3.6.0)
##  foreign                             0.8-71    2018-07-20 [2] CRAN (R 3.6.0)
##  Formula                             1.2-3     2018-05-03 [2] CRAN (R 3.6.0)
##  genefilter                          1.66.0    2019-06-18 [2] Bioconductor  
##  geneplotter                         1.62.0    2019-06-18 [2] Bioconductor  
##  GenomeInfoDb                      * 1.20.0    2019-06-18 [2] Bioconductor  
##  GenomeInfoDbData                    1.2.1     2019-04-26 [2] Bioconductor  
##  GenomicAlignments                   1.20.1    2019-06-18 [2] Bioconductor  
##  GenomicFeatures                   * 1.36.1    2019-06-18 [2] Bioconductor  
##  GenomicFiles                        1.20.0    2019-06-18 [2] Bioconductor  
##  GenomicRanges                     * 1.36.0    2019-06-18 [2] Bioconductor  
##  GGally                              1.4.0     2018-05-17 [2] CRAN (R 3.6.0)
##  ggbio                             * 1.32.0    2019-06-18 [2] Bioconductor  
##  ggplot2                           * 3.2.0     2019-06-16 [2] CRAN (R 3.6.0)
##  glue                                1.3.1     2019-03-12 [2] CRAN (R 3.6.0)
##  graph                               1.62.0    2019-06-18 [2] Bioconductor  
##  gridExtra                         * 2.3       2017-09-09 [2] CRAN (R 3.6.0)
##  gtable                              0.3.0     2019-03-25 [2] CRAN (R 3.6.0)
##  highr                               0.8       2019-03-20 [2] CRAN (R 3.6.0)
##  Hmisc                               4.2-0     2019-01-26 [2] CRAN (R 3.6.0)
##  hms                                 0.4.2     2018-03-10 [2] CRAN (R 3.6.0)
##  htmlTable                           1.13.1    2019-01-07 [2] CRAN (R 3.6.0)
##  htmltools                           0.3.6     2017-04-28 [2] CRAN (R 3.6.0)
##  htmlwidgets                         1.3       2018-09-30 [2] CRAN (R 3.6.0)
##  httpuv                              1.5.1     2019-04-05 [2] CRAN (R 3.6.0)
##  httr                                1.4.0     2018-12-11 [2] CRAN (R 3.6.0)
##  IRanges                           * 2.18.1    2019-06-18 [2] Bioconductor  
##  iterators                         * 1.0.10    2018-07-13 [2] CRAN (R 3.6.0)
##  jsonlite                            1.6       2018-12-07 [2] CRAN (R 3.6.0)
##  knitcitations                       1.0.8     2017-07-04 [2] CRAN (R 3.6.0)
##  knitr                             * 1.23      2019-05-18 [2] CRAN (R 3.6.0)
##  knitrBootstrap                      1.0.2     2018-05-24 [2] CRAN (R 3.6.0)
##  labeling                            0.3       2014-08-23 [2] CRAN (R 3.6.0)
##  later                               0.8.0     2019-02-11 [2] CRAN (R 3.6.0)
##  lattice                             0.20-38   2018-11-04 [2] CRAN (R 3.6.0)
##  latticeExtra                        0.6-28    2016-02-09 [2] CRAN (R 3.6.0)
##  lazyeval                            0.2.2     2019-03-15 [2] CRAN (R 3.6.0)
##  limma                               3.40.2    2019-06-18 [2] Bioconductor  
##  locfit                            * 1.5-9.1   2013-04-20 [2] CRAN (R 3.6.0)
##  lubridate                           1.7.4     2018-04-11 [2] CRAN (R 3.6.0)
##  magrittr                            1.5       2014-11-22 [2] CRAN (R 3.6.0)
##  markdown                            1.0       2019-06-07 [2] CRAN (R 3.6.0)
##  Matrix                              1.2-17    2019-03-22 [2] CRAN (R 3.6.0)
##  matrixStats                         0.54.0    2018-07-23 [2] CRAN (R 3.6.0)
##  memoise                             1.1.0     2017-04-21 [2] CRAN (R 3.6.0)
##  mgcv                              * 1.8-28    2019-03-21 [2] CRAN (R 3.6.0)
##  mime                                0.7       2019-06-11 [2] CRAN (R 3.6.0)
##  munsell                             0.5.0     2018-06-12 [2] CRAN (R 3.6.0)
##  nlme                              * 3.1-140   2019-05-12 [2] CRAN (R 3.6.0)
##  nnet                                7.3-12    2016-02-02 [2] CRAN (R 3.6.0)
##  org.Hs.eg.db                      * 3.8.2     2019-06-18 [2] Bioconductor  
##  OrganismDbi                         1.26.0    2019-06-18 [2] Bioconductor  
##  pillar                              1.4.1     2019-05-28 [2] CRAN (R 3.6.0)
##  pkgconfig                           2.0.2     2018-08-16 [2] CRAN (R 3.6.0)
##  pkgmaker                            0.27      2018-05-25 [2] CRAN (R 3.6.0)
##  plyr                                1.8.4     2016-06-08 [2] CRAN (R 3.6.0)
##  prettyunits                         1.0.2     2015-07-13 [2] CRAN (R 3.6.0)
##  progress                            1.2.2     2019-05-16 [2] CRAN (R 3.6.0)
##  promises                            1.0.1     2018-04-13 [2] CRAN (R 3.6.0)
##  ProtGenerics                        1.16.0    2019-06-18 [2] Bioconductor  
##  purrr                               0.3.2     2019-03-15 [2] CRAN (R 3.6.0)
##  qvalue                              2.16.0    2019-06-18 [2] Bioconductor  
##  R6                                  2.4.0     2019-02-14 [2] CRAN (R 3.6.0)
##  RBGL                                1.60.0    2019-06-18 [2] Bioconductor  
##  RColorBrewer                      * 1.1-2     2014-12-07 [2] CRAN (R 3.6.0)
##  Rcpp                                1.0.1     2019-03-17 [2] CRAN (R 3.6.0)
##  RCurl                               1.95-4.12 2019-03-04 [2] CRAN (R 3.6.0)
##  RefManageR                          1.2.12    2019-04-03 [2] CRAN (R 3.6.0)
##  regionReport                      * 1.18.2    2019-06-18 [1] Bioconductor  
##  registry                            0.5-1     2019-03-05 [2] CRAN (R 3.6.0)
##  reshape                             0.8.8     2018-10-23 [2] CRAN (R 3.6.0)
##  reshape2                            1.4.3     2017-12-11 [2] CRAN (R 3.6.0)
##  rlang                               0.3.4     2019-04-07 [2] CRAN (R 3.6.0)
##  rmarkdown                           1.13      2019-05-22 [2] CRAN (R 3.6.0)
##  rngtools                            1.3.1.1   2019-04-26 [2] CRAN (R 3.6.0)
##  rpart                               4.1-15    2019-04-12 [2] CRAN (R 3.6.0)
##  Rsamtools                           2.0.0     2019-06-18 [2] Bioconductor  
##  RSQLite                             2.1.1     2018-05-06 [2] CRAN (R 3.6.0)
##  rstudioapi                          0.10      2019-03-19 [2] CRAN (R 3.6.0)
##  rtracklayer                         1.44.0    2019-06-18 [2] Bioconductor  
##  S4Vectors                         * 0.22.0    2019-06-18 [2] Bioconductor  
##  scales                              1.0.0     2018-08-09 [2] CRAN (R 3.6.0)
##  sessioninfo                       * 1.1.1     2018-11-05 [2] CRAN (R 3.6.0)
##  shiny                               1.3.2     2019-04-22 [2] CRAN (R 3.6.0)
##  stringi                             1.4.3     2019-03-12 [2] CRAN (R 3.6.0)
##  stringr                             1.4.0     2019-02-10 [2] CRAN (R 3.6.0)
##  SummarizedExperiment                1.14.0    2019-06-18 [2] Bioconductor  
##  survival                            2.44-1.1  2019-04-01 [2] CRAN (R 3.6.0)
##  tibble                              2.1.3     2019-06-06 [2] CRAN (R 3.6.0)
##  tidyselect                          0.2.5     2018-10-11 [2] CRAN (R 3.6.0)
##  TxDb.Hsapiens.UCSC.hg19.knownGene * 3.2.2     2019-04-26 [2] Bioconductor  
##  VariantAnnotation                   1.30.1    2019-06-18 [2] Bioconductor  
##  whisker                           * 0.3-2     2013-04-28 [2] CRAN (R 3.6.0)
##  withr                               2.1.2     2018-03-15 [2] CRAN (R 3.6.0)
##  xfun                                0.7       2019-05-14 [2] CRAN (R 3.6.0)
##  XML                                 3.98-1.20 2019-06-06 [2] CRAN (R 3.6.0)
##  xml2                                1.2.0     2018-01-24 [2] CRAN (R 3.6.0)
##  xtable                              1.8-4     2019-04-21 [2] CRAN (R 3.6.0)
##  XVector                             0.24.0    2019-06-18 [2] Bioconductor  
##  yaml                                2.2.0     2018-07-25 [2] CRAN (R 3.6.0)
##  zlibbioc                            1.30.0    2019-06-18 [2] Bioconductor  
## 
## [1] /tmp/RtmpkOavtq/Rinst17bd6aad58ea
## [2] /home/biocbuild/bbs-3.9-bioc/R/library

Pandoc version used: 2.1.

7 Bibliography

This report was created with regionReport (Collado-Torres, Jaffe, and Leek, 2016) using rmarkdown while knitr (Xie, 2014) and DT (Xie, Cheng, and Tan, 2019) were running behind the scenes. whisker (de Jonge, 2013) was used for creating templates for the pvalueVars and densityVars.

Citations made with knitcitations (Boettiger, 2017). The BibTeX file can be found here.

[1] C. Boettiger. knitcitations: Citations for ‘Knitr’ Markdown Files. R package version 1.0.8. 2017. URL: https://CRAN.R-project.org/package=knitcitations.

[1] L. Collado-Torres, A. E. Jaffe, and J. T. Leek. derfinderPlot: Plotting functions for derfinder. https://github.com/leekgroup/derfinderPlot - R package version 1.18.1. 2017. DOI: 10.18129/B9.bioc.derfinderPlot. URL: http://www.bioconductor.org/packages/derfinderPlot.

## No encoding supplied: defaulting to UTF-8.
## No encoding supplied: defaulting to UTF-8.
## No encoding supplied: defaulting to UTF-8.

[1] H. Wickham. ggplot2: Elegant Graphics for Data Analysis. Springer-Verlag New York, 2016. ISBN: 978-3-319-24277-4. URL: https://ggplot2.tidyverse.org.

[1] Y. Xie. “knitr: A Comprehensive Tool for Reproducible Research in R”. In: Implementing Reproducible Computational Research. Ed. by V. Stodden, F. Leisch and R. D. Peng. ISBN 978-1466561595. Chapman and Hall/CRC, 2014. URL: http://www.crcpress.com/product/isbn/9781466561595.

[1] Y. Xie, J. Cheng, and X. Tan. DT: A Wrapper of the JavaScript Library ‘DataTables’. R package version 0.7. 2019. URL: https://CRAN.R-project.org/package=DT.

[1] T. Yin, D. Cook, and M. Lawrence. “ggbio: an R package for extending the grammar of graphics for genomic data”. In: Genome Biology 13.8 (2012), p. R77.

[1] E. de Jonge. whisker: mustache for R, logicless templating. R package version 0.3-2. 2013. URL: https://CRAN.R-project.org/package=whisker.