Get DNA methylation EPIC data for the example.
## $GSE86831_series_matrix.txt.gz
## ExpressionSet (storageMode: lockedEnvironment)
## assayData: 864935 features, 15 samples
## element names: exprs
## protocolData: none
## phenoData
## sampleNames: GSM2309170 GSM2309171 ... GSM2309184 (15 total)
## varLabels: title geo_accession ... tissue:ch1 (33 total)
## varMetadata: labelDescription
## featureData
## featureNames: cg00000029 cg00000103 ... cg27666123 (864935 total)
## fvarLabels: ID SPOT_ID ... SourceSeq (14 total)
## fvarMetadata: Column Description labelDescription
## experimentData: use 'experimentData(object)'
## pubMedIds: 27717381
## Annotation: GPL21145
epic.matrix <- gse86831$GSE86831_series_matrix.txt.gz %>% exprs
colnames(epic.matrix) <- paste0("C3L.000",1:15)
epic.matrix %>% dim()
## [1] 864935 15
## C3L.0001 C3L.0002 C3L.0003 C3L.0004 C3L.0005 C3L.0006
## cg00000029 0.8283680 0.8354139 0.05658668 0.04282275 0.35627030 0.20198010
## cg00000103 0.2164977 0.2394069 0.39861730 0.35705640 0.66447370 0.45222250
## cg00000109 0.8251206 0.7513673 0.77963550 0.83643360 0.74479860 0.81600280
## cg00000155 0.9184039 0.9028827 0.90118500 0.91898540 0.90891310 0.92960120
## cg00000158 0.9168520 0.9113715 0.93191020 0.91307780 0.92690950 0.92782270
## cg00000165 0.8359243 0.8572026 0.07873143 0.09703349 0.07308517 0.07546386
## C3L.0007 C3L.0008 C3L.0009 C3L.00010 C3L.00011 C3L.00012
## cg00000029 0.32439100 0.20218200 0.41619230 0.54138310 0.5338212 0.5665801
## cg00000103 0.40891410 0.57256860 0.62188910 0.78878380 0.8677205 0.8803490
## cg00000109 0.86966160 0.85955420 0.68624070 0.77484770 0.8659036 0.8849434
## cg00000155 0.87370890 0.91478070 0.91392830 0.89565840 0.9080459 0.9212264
## cg00000158 0.93755640 0.93855110 0.88565760 0.93266590 0.8981978 0.9033220
## cg00000165 0.06433051 0.06738134 0.04520237 0.06496383 0.1230667 0.1254290
## C3L.00013 C3L.00014 C3L.00015
## cg00000029 0.60287830 0.5380207 0.5494488
## cg00000103 0.90468330 0.8709923 0.9216082
## cg00000109 0.86523140 0.9000149 0.8982691
## cg00000155 0.89568590 0.9346259 0.9231887
## cg00000158 0.91580930 0.9110322 0.9097360
## cg00000165 0.08090399 0.1103282 0.1544130
library(TCGAbiolinks)
query <- GDCquery(project = "TCGA-ACC",
data.category = "Transcriptome Profiling",
data.type = "Gene Expression Quantification",
workflow.type = "HTSeq - FPKM-UQ")
GDCdownload(query)
rna <- GDCprepare(query,summarizedExperiment = FALSE)
rna <- rna %>% as.data.frame()
rownames(rna) <- gsub("\\.[0-9]*","",rna$X1)
rna$X1 <- NULL
rna <- rna[,1:15]
## [1] 60483 15
# Create matrix with metadata
colData <- data.frame(row.names = colnames(rna),
"primary" = colnames(rna),
"Group" = c(rep("A",7),
rep("B", 8)))
colData
## Returning distal probes: 342877
mae <- createMAE(exp = rna,
met = epic.matrix,
TCGA = FALSE,
filter.probes = distal.enhancer,
colData = colData,
linearize.exp = TRUE,
genome = "hg38")
## =-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-
## Creating a SummarizedExperiment from gene expression input
## =-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-=-
## Creating a SummarizedExperiment from DNA methylation input
## Removing samples not found in both DNA methylation and gene expression (we are considering the names of the gene expression and DNA methylation columns to be the same)
## MAE saved as: mae_hg38_450K.rda
## A MultiAssayExperiment object of 2 listed
## experiments with user-defined names and respective classes.
## Containing an ExperimentList class object of length 2:
## [1] DNA methylation: RangedSummarizedExperiment with 148376 rows and 15 columns
## [2] Gene expression: RangedSummarizedExperiment with 56602 rows and 15 columns
## Features:
## experiments() - obtain the ExperimentList instance
## colData() - the primary/phenotype DFrame
## sampleMap() - the sample availability DFrame
## `$`, `[`, `[[` - extract colData columns, subset, or experiment
## *Format() - convert into a long or wide DFrame
## assays() - convert ExperimentList to a SimpleList of matrices
## ─ Session info ───────────────────────────────────────────────────────────────
## setting value
## version R version 3.6.1 (2019-07-05)
## os Ubuntu 19.10
## system x86_64, linux-gnu
## ui X11
## language en_US
## collate en_US.UTF-8
## ctype en_US.UTF-8
## tz America/New_York
## date 2020-02-06
##
## ─ Packages ───────────────────────────────────────────────────────────────────
## ! package * version date lib
## acepack 1.4.1 2016-10-29 [2]
## annotate 1.64.0 2019-10-29 [1]
## AnnotationDbi 1.48.0 2019-10-29 [1]
## AnnotationFilter 1.10.0 2019-10-29 [1]
## aroma.light 3.16.0 2019-10-29 [1]
## askpass 1.1 2019-01-13 [2]
## assertthat 0.2.1 2019-03-21 [2]
## backports 1.1.5 2019-10-02 [2]
## base64enc 0.1-3 2015-07-28 [2]
## Biobase * 2.46.0 2019-10-29 [1]
## BiocFileCache 1.10.0 2019-10-29 [1]
## BiocGenerics * 0.32.0 2019-10-29 [1]
## BiocParallel 1.20.0 2019-10-30 [1]
## biomaRt 2.42.0 2019-10-29 [1]
## Biostrings 2.54.0 2019-10-29 [1]
## biovizBase 1.34.0 2019-10-29 [1]
## bit 1.1-15.1 2020-01-14 [2]
## bit64 0.9-7 2017-05-08 [2]
## bitops 1.0-6 2013-08-17 [2]
## blob 1.2.1 2020-01-20 [2]
## broom 0.5.4 2020-01-27 [2]
## BSgenome 1.54.0 2019-10-29 [1]
## callr 3.4.1 2020-01-24 [2]
## checkmate 2.0.0 2020-02-06 [2]
## circlize 0.4.8 2019-09-08 [2]
## cli 2.0.1 2020-01-08 [2]
## clue 0.3-57 2019-02-25 [2]
## cluster 2.1.0 2019-06-19 [4]
## codetools 0.2-16 2018-12-24 [4]
## colorspace 1.4-1 2019-03-18 [2]
## ComplexHeatmap 2.3.2 2020-02-06 [2]
## crayon 1.3.4 2017-09-16 [2]
## curl 4.3 2019-12-02 [2]
## data.table 1.12.6 2019-10-18 [1]
## DBI 1.1.0 2019-12-15 [2]
## dbplyr 1.4.2 2019-06-17 [2]
## DelayedArray 0.12.0 2019-10-29 [1]
## desc 1.2.0 2018-05-01 [2]
## DESeq 1.38.0 2019-10-29 [1]
## devtools 2.2.1 2019-09-24 [2]
## dichromat 2.0-0 2013-01-24 [2]
## digest 0.6.22 2019-10-21 [1]
## doParallel 1.0.15 2019-08-02 [2]
## downloader 0.4 2015-07-09 [2]
## dplyr * 0.8.4 2020-01-31 [2]
## EDASeq 2.20.0 2019-10-29 [1]
## edgeR 3.28.0 2019-10-29 [1]
## ellipsis 0.3.0 2019-09-20 [2]
## ELMER * 2.11.0 2020-02-06 [2]
## ELMER.data * 2.10.0 2019-11-05 [2]
## ensembldb 2.10.0 2019-10-29 [1]
## evaluate 0.14 2019-05-28 [2]
## fansi 0.4.1 2020-01-08 [2]
## foreach 1.4.7 2019-07-27 [2]
## foreign 0.8-75 2020-01-20 [4]
## Formula 1.2-3 2018-05-03 [2]
## fs 1.3.1 2019-05-06 [2]
## genefilter 1.68.0 2019-10-29 [1]
## geneplotter 1.64.0 2019-10-29 [1]
## generics 0.0.2 2018-11-29 [2]
## GenomeInfoDb 1.22.0 2019-10-29 [1]
## GenomeInfoDbData 1.2.2 2019-11-06 [1]
## GenomicAlignments 1.22.0 2019-10-29 [1]
## GenomicFeatures 1.38.0 2019-10-29 [1]
## GenomicRanges 1.38.0 2019-10-29 [1]
## GEOquery * 2.54.0 2019-10-29 [1]
## GetoptLong 0.1.8 2020-01-08 [2]
## ggplot2 3.2.1 2019-08-10 [2]
## ggpubr 0.2.4 2019-11-14 [2]
## ggrepel 0.8.1 2019-05-07 [2]
## ggsignif 0.6.0 2019-08-08 [2]
## ggthemes 4.2.0 2019-05-13 [2]
## GlobalOptions 0.1.1 2019-09-30 [2]
## glue 1.3.1 2019-03-12 [2]
## gridExtra 2.3 2017-09-09 [2]
## gtable 0.3.0 2019-03-25 [1]
## Gviz 1.30.0 2019-10-29 [1]
## Hmisc 4.3-0 2019-11-07 [2]
## hms 0.5.3 2020-01-08 [2]
## htmlTable 1.13.3 2019-12-04 [2]
## htmltools 0.4.0 2019-10-04 [2]
## htmlwidgets 1.5.1 2019-10-08 [2]
## httr 1.4.1 2019-08-05 [2]
## hwriter 1.3.2 2014-09-10 [2]
## IRanges 2.20.0 2019-10-29 [1]
## iterators 1.0.12 2019-07-26 [2]
## jpeg 0.1-8.1 2019-10-24 [1]
## jsonlite 1.6.1 2020-02-02 [2]
## km.ci 0.5-2 2009-08-30 [2]
## KMsurv 0.1-5 2012-12-03 [2]
## knitr 1.28 2020-02-06 [2]
## lattice 0.20-38 2018-11-04 [4]
## latticeExtra 0.6-29 2019-12-19 [2]
## lazyeval 0.2.2 2019-03-15 [2]
## lifecycle 0.1.0 2019-08-01 [2]
## limma 3.42.0 2019-10-29 [1]
## locfit 1.5-9.1 2013-04-20 [2]
## magrittr 1.5 2014-11-22 [2]
## Matrix 1.2-18 2019-11-27 [2]
## matrixStats 0.55.0 2019-09-07 [2]
## memoise 1.1.0 2017-04-21 [2]
## mgcv 1.8-31 2019-11-09 [4]
## MultiAssayExperiment 1.12.0 2019-10-29 [1]
## munsell 0.5.0 2018-06-12 [2]
## nlme 3.1-144 2020-02-06 [4]
## nnet 7.3-12 2016-02-02 [4]
## openssl 1.4.1 2019-07-18 [2]
## parsetools 0.1.1 2019-07-11 [2]
## pillar 1.4.3 2019-12-20 [2]
## pkgbuild 1.0.6 2019-10-09 [2]
## pkgcond 0.1.0 2018-12-03 [2]
## pkgconfig 2.0.3 2019-09-22 [2]
## pkgload 1.0.2 2018-10-29 [2]
## plotly 4.9.1 2019-11-07 [2]
## plyr 1.8.5 2019-12-10 [2]
## png 0.1-7 2013-12-03 [2]
## postlogic 0.1.0.1 2019-12-18 [2]
## prettyunits 1.1.1 2020-01-24 [2]
## processx 3.4.1 2019-07-18 [2]
## progress 1.2.2 2019-05-16 [2]
## ProtGenerics 1.18.0 2019-10-29 [1]
## ps 1.3.0 2018-12-21 [2]
## purrr 0.3.3 2019-10-18 [1]
## purrrogress 0.1.1 2019-07-22 [2]
## R.methodsS3 1.7.1 2016-02-16 [2]
## R.oo 1.23.0 2019-11-03 [1]
## R.utils 2.9.2 2019-12-08 [2]
## R6 2.4.1 2019-11-12 [2]
## rappdirs 0.3.1 2016-03-28 [2]
## RColorBrewer 1.1-2 2014-12-07 [1]
## Rcpp 1.0.3 2019-11-08 [2]
## RCurl 1.98-1.1 2020-01-19 [2]
## readr 1.3.1 2018-12-21 [2]
## remotes 2.1.0 2019-06-24 [2]
## reshape 0.8.8 2018-10-23 [2]
## rjson 0.2.20 2018-06-08 [2]
## rlang 0.4.4 2020-01-28 [2]
## rmarkdown 1.16 2019-10-01 [1]
## rpart 4.1-15 2019-04-12 [4]
## rprojroot 1.3-2 2018-01-03 [2]
## Rsamtools 2.2.0 2019-10-29 [1]
## RSQLite 2.2.0 2020-01-07 [2]
## rstudioapi 0.10 2019-03-19 [2]
## rtracklayer 1.46.0 2019-10-29 [1]
## rvest 0.3.5 2019-11-08 [2]
## S4Vectors 0.24.0 2019-10-29 [1]
## scales 1.1.0 2019-11-18 [2]
## selectr 0.4-2 2019-11-20 [2]
## sessioninfo 1.1.1 2018-11-05 [2]
## shape 1.4.4 2018-02-07 [2]
## ShortRead 1.44.0 2019-10-29 [1]
## stringi 1.4.5 2020-01-11 [2]
## stringr 1.4.0 2019-02-10 [2]
## SummarizedExperiment 1.16.0 2019-10-29 [1]
## survival 3.1-8 2019-12-03 [4]
## survminer 0.4.6 2019-09-03 [2]
## survMisc 0.5.5 2018-07-05 [2]
## sva 3.34.0 2019-10-29 [1]
## R TCGAbiolinks * 2.15.3 <NA> [2]
## testextra 0.1.0.1 2019-12-18 [2]
## testthat 2.3.1 2019-12-01 [2]
## tibble 2.1.3 2019-06-06 [2]
## tidyr 1.0.2 2020-01-24 [2]
## tidyselect 1.0.0 2020-01-27 [2]
## usethis 1.5.1 2019-07-04 [2]
## VariantAnnotation 1.32.0 2019-10-29 [1]
## vctrs 0.2.2 2020-01-24 [2]
## viridisLite 0.3.0 2018-02-01 [2]
## withr 2.1.2 2018-03-15 [2]
## xfun 0.10 2019-10-01 [1]
## XML 3.99-0.3 2020-01-20 [2]
## xml2 1.2.2 2019-08-09 [2]
## xtable 1.8-4 2019-04-21 [2]
## XVector 0.26.0 2019-10-29 [1]
## yaml 2.2.1 2020-02-01 [2]
## zlibbioc 1.32.0 2019-10-29 [1]
## zoo 1.8-7 2020-01-10 [2]
## source
## CRAN (R 3.6.1)
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.0)
## CRAN (R 3.6.1)
## Github (jokergoo/ComplexHeatmap@716e015)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## Bioconductor
## CRAN (R 3.6.1)
## Github (tiagochst/ELMER@db0456a)
## Bioconductor
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## Bioconductor
## CRAN (R 3.6.1)
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.0)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.0)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## <NA>
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
## Bioconductor
## CRAN (R 3.6.1)
##
## [1] /home/tiagochst/R/x86_64-pc-linux-gnu-library/3.6
## [2] /usr/local/lib/R/site-library
## [3] /usr/lib/R/site-library
## [4] /usr/lib/R/library
##
## R ── Package was removed from disk.