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")

Change the type of Dandelion plot

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)

Change the number of dandelions

## 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)

Add y-axis (yaxis)

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')

Session Info

sessionInfo()

R Under development (unstable) (2024-03-06 r86056) Platform: x86_64-pc-linux-gnu Running under: Ubuntu 22.04.4 LTS

Matrix products: default BLAS: /home/biocbuild/bbs-3.19-bioc/R/lib/libRblas.so LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.10.0

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

time zone: America/New_York tzcode source: system (glibc)

attached base packages: [1] grid stats4 stats graphics grDevices utils datasets [8] methods base

other attached packages: [1] httr_1.4.7
[2] VariantAnnotation_1.49.6
[3] Rsamtools_2.19.3
[4] Biostrings_2.71.4
[5] XVector_0.43.1
[6] SummarizedExperiment_1.33.3
[7] MatrixGenerics_1.15.0
[8] matrixStats_1.2.0
[9] org.Hs.eg.db_3.18.0
[10] TxDb.Hsapiens.UCSC.hg19.knownGene_3.2.2 [11] GenomicFeatures_1.55.4
[12] AnnotationDbi_1.65.2
[13] Biobase_2.63.0
[14] Gviz_1.47.1
[15] rtracklayer_1.63.1
[16] trackViewer_1.39.17
[17] GenomicRanges_1.55.3
[18] GenomeInfoDb_1.39.9
[19] IRanges_2.37.1
[20] S4Vectors_0.41.4
[21] BiocGenerics_0.49.1

loaded via a namespace (and not attached): [1] strawr_0.0.91 RColorBrewer_1.1-3 rstudioapi_0.15.0
[4] jsonlite_1.8.8 magrittr_2.0.3 rmarkdown_2.26
[7] BiocIO_1.13.0 zlibbioc_1.49.3 vctrs_0.6.5
[10] memoise_2.0.1 RCurl_1.98-1.14 base64enc_0.1-3
[13] htmltools_0.5.7 S4Arrays_1.3.6 progress_1.2.3
[16] plotrix_3.8-4 curl_5.2.1 Rhdf5lib_1.25.1
[19] rhdf5_2.47.6 SparseArray_1.3.4 Formula_1.2-5
[22] sass_0.4.9 bslib_0.6.1 htmlwidgets_1.6.4
[25] httr2_1.0.0 cachem_1.0.8 GenomicAlignments_1.39.4 [28] igraph_2.0.3 lifecycle_1.0.4 pkgconfig_2.0.3
[31] Matrix_1.6-5 R6_2.5.1 fastmap_1.1.1
[34] GenomeInfoDbData_1.2.11 digest_0.6.35 colorspace_2.1-0
[37] Hmisc_5.1-2 RSQLite_2.3.5 filelock_1.0.3
[40] fansi_1.0.6 abind_1.4-5 compiler_4.4.0
[43] bit64_4.0.5 htmlTable_2.4.2 backports_1.4.1
[46] BiocParallel_1.37.1 DBI_1.2.2 highr_0.10
[49] biomaRt_2.59.1 rappdirs_0.3.3 DelayedArray_0.29.9
[52] rjson_0.2.21 tools_4.4.0 foreign_0.8-86
[55] nnet_7.3-19 glue_1.7.0 restfulr_0.0.15
[58] InteractionSet_1.31.0 rhdf5filters_1.15.4 checkmate_2.3.1
[61] cluster_2.1.6 generics_0.1.3 gtable_0.3.4
[64] BSgenome_1.71.2 ensembldb_2.27.1 data.table_1.15.2
[67] hms_1.1.3 xml2_1.3.6 utf8_1.2.4
[70] pillar_1.9.0 stringr_1.5.1 dplyr_1.1.4
[73] BiocFileCache_2.11.1 lattice_0.22-5 bit_4.0.5
[76] deldir_2.0-4 biovizBase_1.51.0 tidyselect_1.2.1
[79] knitr_1.45 gridExtra_2.3 ProtGenerics_1.35.4
[82] xfun_0.42 stringi_1.8.3 lazyeval_0.2.2
[85] yaml_2.3.8 evaluate_0.23 codetools_0.2-19
[88] interp_1.1-6 tibble_3.2.1 BiocManager_1.30.22
[91] cli_3.6.2 rpart_4.1.23 munsell_0.5.0
[94] jquerylib_0.1.4 dichromat_2.0-0.1 Rcpp_1.0.12
[97] grImport_0.9-7 dbplyr_2.4.0 png_0.1-8
[100] XML_3.99-0.16.1 parallel_4.4.0 ellipsis_0.3.2
[103] ggplot2_3.5.0 blob_1.2.4 prettyunits_1.2.0
[106] latticeExtra_0.6-30 jpeg_0.1-10 AnnotationFilter_1.27.0 [109] bitops_1.0-7 txdbmaker_0.99.6 scales_1.3.0
[112] crayon_1.5.2 BiocStyle_2.31.0 rlang_1.1.3
[115] KEGGREST_1.43.0