if (!require("BiocManager", quietly = TRUE))
install.packages("BiocManager")
BiocManager::install("terraTCGAdata")
The terraTCGAdata
R package aims to import TCGA datasets, as
MultiAssayExperiment,
available on the Terra platform. The package provides a set of
functions that allow the discovery of relevant datasets. It provides
one main function and two helper functions:
terraTCGAdata
allows the creation of the MultiAssayExperiment
object
from the different indicated resources.
The getClinicalTable
and getAssayTable
functions allow for the
discovery of datasets within the Terra data model. The column names
from these tables can be provided as inputs to the terraTCGAdata
function.
Some public Terra workspaces come pre-packaged with TCGA data (i.e., cloud data
resources are linked within the data model). Particularly the workspaces that
are labelled OpenAccess_V1-0
. Datasets harmonized to the hg38 genome, such as
those from the Genomic Data Commons data repository, use a different data model
/ workflow and are not compatible with the functions in this package. For those
that are, we make use of the Terra data model and represent the data as
MultiAssayExperiment
.
For more information on MultiAssayExperiment
, please see the vignette in
that package.
library(AnVIL)
library(terraTCGAdata)
A valid GCloud SDK installation is required to use the package. To get set up,
see the Bioconductor tutorials for running RStudio on Terra. Use the
gcloud_exists()
function from the AnVIL package to
identify whether it is installed in your system.
gcloud_exists()
## [1] FALSE
You can also use the gcloud_project
to set a project name by specifying
the project argument:
gcloud_project()
To get a table of available TCGA workspaces, use the selectTCGAworkspace()
function:
selectTCGAworkspace()
You can also set the package-wide option with the terraTCGAworkspace
function
and check the setting with getOption('terraTCGAdata.workspace')
or by running
terraTCGAworkspace
function.
terraTCGAworkspace("TCGA_COAD_OpenAccess_V1-0_DATA")
getOption("terraTCGAdata.workspace")
In order to determine what datasets to download, use the getClinicalTable
function to list all of the columns that correspond to clinical data
from the different collection centers.
ct <- getClinicalTable(workspace = "TCGA_COAD_OpenAccess_V1-0_DATA")
ct
names(ct)
After picking the column in the getClinicalTable
output, use the column
name as input to the getClinical
function to obtain the data:
column_name <- "clin__bio__nationwidechildrens_org__Level_1__biospecimen__clin"
clin <- getClinical(
columnName = column_name,
participants = TRUE,
workspace = "TCGA_COAD_OpenAccess_V1-0_DATA"
)
clin[, 1:6]
dim(clin)
We use the same approach for assay data. We first produce a list of assays
from the getAssayTable
and then we select one along with any sample
codes of interest.
at <- getAssayTable(workspace = "TCGA_COAD_OpenAccess_V1-0_DATA")
at
names(at)
You can get a summary table of all the samples in the adata by using the
sampleTypesTable
:
sampleTypesTable(workspace = "TCGA_COAD_OpenAccess_V1-0_DATA")
Note that if you have the package-wide option set, the workspace argument is not needed in the function call.
prot <- getAssayData(
assayName = "protein_exp__mda_rppa_core__mdanderson_org__Level_3__protein_normalization__data",
sampleCode = c("01", "10"),
workspace = "TCGA_COAD_OpenAccess_V1-0_DATA",
sampleIdx = 1:4
)
head(prot)
Finally, once you have collected all the relevant column names,
these can be inputs to the main terraTCGAdata
function:
mae <- terraTCGAdata(
clinicalName = "clin__bio__nationwidechildrens_org__Level_1__biospecimen__clin",
assays =
c("protein_exp__mda_rppa_core__mdanderson_org__Level_3__protein_normalization__data",
"rnaseqv2__illuminahiseq_rnaseqv2__unc_edu__Level_3__RSEM_genes_normalized__data"),
sampleCode = NULL,
split = FALSE,
sampleIdx = 1:4,
workspace = "TCGA_COAD_OpenAccess_V1-0_DATA"
)
mae
We expect that most OpenAccess_V1-0
cancer datasets follow this data model.
If you encounter any errors, please provide a minimally reproducible example
at https://github.com/waldronlab/terraTCGAdata.
sessionInfo()
## R version 4.4.1 (2024-06-14)
## Platform: x86_64-pc-linux-gnu
## Running under: Ubuntu 24.04.1 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.20-bioc/R/lib/libRblas.so
## LAPACK: /usr/lib/x86_64-linux-gnu/lapack/liblapack.so.3.12.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] stats4 stats graphics grDevices utils datasets methods
## [8] base
##
## other attached packages:
## [1] terraTCGAdata_1.10.0 MultiAssayExperiment_1.32.0
## [3] SummarizedExperiment_1.36.0 Biobase_2.66.0
## [5] GenomicRanges_1.58.0 GenomeInfoDb_1.42.0
## [7] IRanges_2.40.0 S4Vectors_0.44.0
## [9] BiocGenerics_0.52.0 MatrixGenerics_1.18.0
## [11] matrixStats_1.4.1 AnVILGCP_1.0.0
## [13] AnVIL_1.18.0 AnVILBase_1.0.0
## [15] dplyr_1.1.4 BiocStyle_2.34.0
##
## loaded via a namespace (and not attached):
## [1] xfun_0.48 bslib_0.8.0 httr2_1.0.5
## [4] htmlwidgets_1.6.4 lattice_0.22-6 vctrs_0.6.5
## [7] tools_4.4.1 generics_0.1.3 parallel_4.4.1
## [10] tibble_3.2.1 fansi_1.0.6 pkgconfig_2.0.3
## [13] BiocBaseUtils_1.8.0 Matrix_1.7-1 rapiclient_0.1.8
## [16] lifecycle_1.0.4 GenomeInfoDbData_1.2.13 compiler_4.4.1
## [19] codetools_0.2-20 httpuv_1.6.15 htmltools_0.5.8.1
## [22] sass_0.4.9 yaml_2.3.10 crayon_1.5.3
## [25] later_1.3.2 pillar_1.9.0 jquerylib_0.1.4
## [28] tidyr_1.3.1 DT_0.33 DelayedArray_0.32.0
## [31] cachem_1.1.0 abind_1.4-8 mime_0.12
## [34] tidyselect_1.2.1 digest_0.6.37 purrr_1.0.2
## [37] bookdown_0.41 grid_4.4.1 fastmap_1.2.0
## [40] SparseArray_1.6.0 cli_3.6.3 magrittr_2.0.3
## [43] S4Arrays_1.6.0 utf8_1.2.4 UCSC.utils_1.2.0
## [46] promises_1.3.0 rappdirs_0.3.3 rmarkdown_2.28
## [49] lambda.r_1.2.4 XVector_0.46.0 httr_1.4.7
## [52] futile.logger_1.4.3 shiny_1.9.1 evaluate_1.0.1
## [55] knitr_1.48 miniUI_0.1.1.1 rlang_1.1.4
## [58] futile.options_1.0.1 Rcpp_1.0.13 xtable_1.8-4
## [61] glue_1.8.0 BiocManager_1.30.25 formatR_1.14
## [64] jsonlite_1.8.9 R6_2.5.1 zlibbioc_1.52.0