Contents

1 terraTCGAData

1.1 Installation

if (!require("BiocManager", quietly = TRUE))
    install.packages("BiocManager")

BiocManager::install("terraTCGAdata")

2 Overview

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:

  1. terraTCGAdata allows the creation of the MultiAssayExperiment object from the different indicated resources.

  2. 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.

2.1 Data

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.

3 Requirements

3.1 Loading packages

library(AnVIL)
library(terraTCGAdata)

3.2 gcloud sdk installation

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

4 Default Data Workspace

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

5 Clinical data resources

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)

6 Clinical data download

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)

7 Assay data resources

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)

8 Summary of sample types in the data

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

9 Intermediate function for obtaining only the 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)

10 MultiAssayExperiment

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.

11 Session Info

sessionInfo()
## R version 4.3.1 (2023-06-16)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 22.04.3 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.18-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] stats4    stats     graphics  grDevices utils     datasets  methods  
## [8] base     
## 
## other attached packages:
##  [1] terraTCGAdata_1.6.0         MultiAssayExperiment_1.28.0
##  [3] SummarizedExperiment_1.32.0 Biobase_2.62.0             
##  [5] GenomicRanges_1.54.0        GenomeInfoDb_1.38.0        
##  [7] IRanges_2.36.0              S4Vectors_0.40.0           
##  [9] BiocGenerics_0.48.0         MatrixGenerics_1.14.0      
## [11] matrixStats_1.0.0           AnVIL_1.14.0               
## [13] dplyr_1.1.3                 BiocStyle_2.30.0           
## 
## loaded via a namespace (and not attached):
##  [1] xfun_0.40               bslib_0.5.1             htmlwidgets_1.6.2      
##  [4] lattice_0.22-5          vctrs_0.6.4             tools_4.3.1            
##  [7] bitops_1.0-7            generics_0.1.3          parallel_4.3.1         
## [10] tibble_3.2.1            fansi_1.0.5             pkgconfig_2.0.3        
## [13] Matrix_1.6-1.1          rapiclient_0.1.3        lifecycle_1.0.3        
## [16] GenomeInfoDbData_1.2.11 compiler_4.3.1          codetools_0.2-19       
## [19] httpuv_1.6.12           htmltools_0.5.6.1       sass_0.4.7             
## [22] RCurl_1.98-1.12         yaml_2.3.7              later_1.3.1            
## [25] pillar_1.9.0            crayon_1.5.2            jquerylib_0.1.4        
## [28] tidyr_1.3.0             ellipsis_0.3.2          DT_0.30                
## [31] DelayedArray_0.28.0     cachem_1.0.8            abind_1.4-5            
## [34] mime_0.12               tidyselect_1.2.0        digest_0.6.33          
## [37] purrr_1.0.2             bookdown_0.36           grid_4.3.1             
## [40] fastmap_1.1.1           SparseArray_1.2.0       cli_3.6.1              
## [43] magrittr_2.0.3          S4Arrays_1.2.0          utf8_1.2.4             
## [46] promises_1.2.1          rmarkdown_2.25          lambda.r_1.2.4         
## [49] XVector_0.42.0          httr_1.4.7              futile.logger_1.4.3    
## [52] shiny_1.7.5.1           evaluate_0.22           knitr_1.44             
## [55] miniUI_0.1.1.1          rlang_1.1.1             futile.options_1.0.1   
## [58] Rcpp_1.0.11             xtable_1.8-4            glue_1.6.2             
## [61] BiocManager_1.30.22     formatR_1.14            jsonlite_1.8.7         
## [64] R6_2.5.1                zlibbioc_1.48.0