Abstract
Visualize high dense methylation or mutation data along with annotation as track layers via Dandelion Plot.Sometimes, there are as many as hundreds of SNPs invoved in one gene. Dandelion plot can be used to depict such dense SNPs. Please note that the height of the dandelion indicates the desity of the SNPs.
library(trackViewer)
library(TxDb.Hsapiens.UCSC.hg19.knownGene)
library(org.Hs.eg.db)
library(rtracklayer)
methy <- import(system.file("extdata", "methy.bed", package="trackViewer"), "BED")
gr <- GRanges("chr22", IRanges(50968014, 50970514, names="TYMP"))
trs <- geneModelFromTxdb(TxDb.Hsapiens.UCSC.hg19.knownGene,
org.Hs.eg.db,
gr=gr)
features <- c(range(trs[[1]]$dat), range(trs[[5]]$dat))
names(features) <- c(trs[[1]]$name, trs[[5]]$name)
features$fill <- c("lightblue", "mistyrose")
features$height <- c(.02, .04)
dandelion.plot(methy, features, ranges=gr, type="pin")
There are one more type for dandelion plot, i.e., type “fan”. The area of the fan indicates the percentage of methylation or rate of mutation.
methy$color <- 3
methy$border <- "gray"
## Score info is required and the score must be a number in [0, 1]
m <- max(methy$score)
methy$score <- methy$score/m
dandelion.plot(methy, features, ranges=gr, type="fan")
methy$color <- rep(list(c(3, 5)), length(methy))
methy$score2 <- (max(methy$score) - methy$score)/m
legends <- list(list(labels=c("s1", "s2"), fill=c(3, 5)))
dandelion.plot(methy, features, ranges=gr, type="pie", legend=legends)
## Less dandelions
dandelion.plot(methy, features, ranges=gr, type="circle", maxgaps=1/10)
## More dandelions
dandelion.plot(methy, features, ranges=gr, type="circle", maxgaps=1/100)
Users can also specify the maximum distance between neighboring dandelions by setting the maxgaps as a GRanges object.
maxgaps <- tile(gr, n = 10)[[1]]
dandelion.plot(methy, features, ranges=gr, type="circle", maxgaps=maxgaps)
Set yaxis to TRUE to add y-axis, and set heightMethod
=mean
to use the mean score as the height.
dandelion.plot(methy, features, ranges=gr, type="pie",
maxgaps=1/100, yaxis = TRUE, heightMethod = mean,
ylab='mean of methy scores')
yaxis = c(0, 0.5, 1)
dandelion.plot(methy, features, ranges=gr, type="pie",
maxgaps=1/100, yaxis = yaxis, heightMethod = mean,
ylab='mean of methy scores')
sessionInfo()
R version 4.2.0 (2022-04-22) Platform: x86_64-pc-linux-gnu (64-bit) Running under: Ubuntu 20.04.4 LTS
Matrix products: default BLAS: /home/biocbuild/bbs-3.15-bioc/R/lib/libRblas.so LAPACK: /home/biocbuild/bbs-3.15-bioc/R/lib/libRlapack.so
locale: [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C
[3] LC_TIME=en_GB LC_COLLATE=C
[5] LC_MONETARY=en_US.UTF-8 LC_MESSAGES=en_US.UTF-8
[7] LC_PAPER=en_US.UTF-8 LC_NAME=C
[9] LC_ADDRESS=C LC_TELEPHONE=C
[11] LC_MEASUREMENT=en_US.UTF-8 LC_IDENTIFICATION=C
attached base packages: [1] grid stats4 stats graphics grDevices utils datasets [8] methods base
other attached packages: [1] httr_1.4.3
[2] VariantAnnotation_1.42.1
[3] Rsamtools_2.12.0
[4] Biostrings_2.64.0
[5] XVector_0.36.0
[6] SummarizedExperiment_1.26.1
[7] MatrixGenerics_1.8.0
[8] matrixStats_0.62.0
[9] org.Hs.eg.db_3.15.0
[10] TxDb.Hsapiens.UCSC.hg19.knownGene_3.2.2 [11] GenomicFeatures_1.48.1
[12] AnnotationDbi_1.58.0
[13] Biobase_2.56.0
[14] Gviz_1.40.1
[15] rtracklayer_1.56.0
[16] trackViewer_1.32.1
[17] Rcpp_1.0.8.3
[18] GenomicRanges_1.48.0
[19] GenomeInfoDb_1.32.2
[20] IRanges_2.30.0
[21] S4Vectors_0.34.0
[22] BiocGenerics_0.42.0
loaded via a namespace (and not attached): [1] colorspace_2.0-3 rjson_0.2.21 ellipsis_0.3.2
[4] biovizBase_1.44.0 htmlTable_2.4.0 base64enc_0.1-3
[7] dichromat_2.0-0.1 rstudioapi_0.13 bit64_4.0.5
[10] fansi_1.0.3 xml2_1.3.3 splines_4.2.0
[13] cachem_1.0.6 knitr_1.39 Formula_1.2-4
[16] jsonlite_1.8.0 cluster_2.1.3 dbplyr_2.1.1
[19] png_0.1-7 grImport_0.9-5 graph_1.74.0
[22] BiocManager_1.30.17 compiler_4.2.0 backports_1.4.1
[25] lazyeval_0.2.2 assertthat_0.2.1 Matrix_1.4-1
[28] fastmap_1.1.0 cli_3.3.0 htmltools_0.5.2
[31] prettyunits_1.1.1 tools_4.2.0 gtable_0.3.0
[34] glue_1.6.2 GenomeInfoDbData_1.2.8 dplyr_1.0.9
[37] rappdirs_0.3.3 jquerylib_0.1.4 rhdf5filters_1.8.0
[40] vctrs_0.4.1 xfun_0.31 stringr_1.4.0
[43] lifecycle_1.0.1 ensembldb_2.20.1 restfulr_0.0.13
[46] InteractionSet_1.24.0 XML_3.99-0.9 zlibbioc_1.42.0
[49] scales_1.2.0 BiocStyle_2.24.0 BSgenome_1.64.0
[52] ProtGenerics_1.28.0 hms_1.1.1 parallel_4.2.0
[55] rhdf5_2.40.0 AnnotationFilter_1.20.0 RColorBrewer_1.1-3
[58] yaml_2.3.5 curl_4.3.2 memoise_2.0.1
[61] gridExtra_2.3 ggplot2_3.3.6 sass_0.4.1
[64] biomaRt_2.52.0 rpart_4.1.16 latticeExtra_0.6-29
[67] stringi_1.7.6 RSQLite_2.2.14 highr_0.9
[70] BiocIO_1.6.0 plotrix_3.8-2 checkmate_2.1.0
[73] filelock_1.0.2 BiocParallel_1.30.2 rlang_1.0.2
[76] pkgconfig_2.0.3 bitops_1.0-7 evaluate_0.15
[79] lattice_0.20-45 Rhdf5lib_1.18.2 purrr_0.3.4
[82] GenomicAlignments_1.32.0 htmlwidgets_1.5.4 bit_4.0.4
[85] tidyselect_1.1.2 magrittr_2.0.3 R6_2.5.1
[88] generics_0.1.2 Hmisc_4.7-0 DelayedArray_0.22.0
[91] DBI_1.1.2 pillar_1.7.0 foreign_0.8-82
[94] survival_3.3-1 KEGGREST_1.36.0 RCurl_1.98-1.6
[97] nnet_7.3-17 tibble_3.1.7 crayon_1.5.1
[100] utf8_1.2.2 BiocFileCache_2.4.0 rmarkdown_2.14
[103] jpeg_0.1-9 progress_1.2.2 data.table_1.14.2
[106] Rgraphviz_2.40.0 blob_1.2.3 digest_0.6.29
[109] munsell_0.5.0 bslib_0.3.1