The National Cancer Institute (NCI) has established the Genomic Data Commons (GDC). The GDC provides the cancer research community with an open and unified repository for sharing and accessing data across numerous cancer studies and projects via a high-performance data transfer and query infrastructure. The GenomicDataCommons Bioconductor package provides basic infrastructure for querying, accessing, and mining genomic datasets available from the GDC. We expect that the Bioconductor developer and the larger bioinformatics communities will build on the GenomicDataCommons package to add higher-level functionality and expose cancer genomics data to the plethora of state-of-the-art bioinformatics methods available in Bioconductor.
From the Genomic Data Commons (GDC) website:
The National Cancer Institute’s (NCI’s) Genomic Data Commons (GDC) is a data sharing platform that promotes precision medicine in oncology. It is not just a database or a tool; it is an expandable knowledge network supporting the import and standardization of genomic and clinical data from cancer research programs.
The GDC contains NCI-generated data from some of the largest and most comprehensive cancer genomic datasets, including The Cancer Genome Atlas (TCGA) and Therapeutically Applicable Research to Generate Effective Therapies (TARGET). For the first time, these datasets have been harmonized using a common set of bioinformatics pipelines, so that the data can be directly compared.
As a growing knowledge system for cancer, the GDC also enables researchers to submit data, and harmonizes these data for import into the GDC. As more researchers add clinical and genomic data to the GDC, it will become an even more powerful tool for making discoveries about the molecular basis of cancer that may lead to better care for patients.
The data model for the GDC is complex, but it worth a quick overview. The data model is encoded as a so-called property graph. Nodes represent entities such as Projects, Cases, Diagnoses, Files (various kinds), and Annotations. The relationships between these entities are maintained as edges. Both nodes and edges may have Properties that supply instance details. The GDC API exposes these nodes and edges in a somewhat simplified set of RESTful endpoints.
This software is in development and will likely change in response to user feedback. To report bugs or problems, either submit a new issue or submit a bug.report(package='GenomicDataCommons')
from within R (which will redirect you to the new issue on GitHub).
Installation is available from GitHub as of now.
source('https://bioconductor.org/biocLite.R')
biocLite('GenomicDataCommons')
library(GenomicDataCommons)
GenomicDataCommons::status()
## $commit
## [1] "a38d9114206f253599cfcb12e454fc10582be38d"
##
## $data_release
## [1] "Data Release 9.0 - October 24, 2017"
##
## $status
## [1] "OK"
##
## $tag
## [1] "1.10.0"
##
## $version
## [1] 1
If this statement results in an error such as SSL connect error
, see the troubleshooting section below.
The following code builds a manifest
that can be used to guide the download of raw data. Here, filtering finds gene expression files quantified as raw counts using HTSeq
from ovarian cancer patients.
library(magrittr)
ge_manifest = files() %>%
filter( ~ cases.project.project_id == 'TCGA-OV' &
type == 'gene_expression' &
analysis.workflow_type == 'HTSeq - Counts') %>%
manifest()
This code block downloads the 379 gene expression files specified in the query above. Using multiple processes to do the download very significantly speeds up the transfer in many cases. On a standard 1Gb connection, the following completes in about 30 seconds.
destdir = tempdir()
fnames = lapply(ge_manifest$id[1:20],gdcdata,
destination_dir=destdir,overwrite=TRUE,
progress=FALSE)
If the download had included controlled-access data, the download above would have needed to include a token
. Details are available in the authentication section below.
expands = c("diagnoses","annotations",
"demographic","exposures")
clinResults = cases() %>%
GenomicDataCommons::select(NULL) %>%
GenomicDataCommons::expand(expands) %>%
results(size=50)
clinDF = as.data.frame(clinResults)
library(DT)
datatable(clinDF, extensions = 'Scroller', options = list(
deferRender = TRUE,
scrollY = 200,
scrollX = TRUE,
scroller = TRUE
))
# Basic design
This package design is meant to have some similarities to the “hadleyverse” approach of dplyr. Roughly, the functionality for finding and accessing files and metadata can be divided into:
In addition, there are exhiliary functions for asking the GDC API for information about available and default fields, slicing BAM files, and downloading actual data files. Here is an overview of functionality1 See individual function and methods documentation for specific details..
projects()
cases()
files()
annotations()
filter()
facet()
select()
mapping()
available_fields()
default_fields()
grep_fields()
field_picker()
available_values()
available_expand()
results()
count()
response()
gdcdata()
transfer()
gdc_client()
aggregations()
gdc_token()
slicing()
There are two main classes of operations when working with the NCI GDC.
Both classes of operation are reviewed in detail in the following sections.
Vast amounts of metadata about cases (patients, basically), files, projects, and so-called annotations are available via the NCI GDC API. Typically, one will want to query metadata to either focus in on a set of files for download or transfer or to perform so-called aggregations (pivot-tables, facets, similar to the R table()
functionality).
Querying metadata starts with creating a “blank” query. One will often then want to filter
the query to limit results prior to retrieving results. The GenomicDataCommons package has helper functions for listing fields that are available for filtering.
In addition to fetching results, the GDC API allows faceting, or aggregating,, useful for compiling reports, generating dashboards, or building user interfaces to GDC data (see GDC web query interface for a non-R-based example).
A query of the GDC starts its life in R. Queries follow the four metadata endpoints available at the GDC. In particular, there are four convenience functions that each create GDCQuery
objects (actually, specific subclasses of GDCQuery
):
projects()
cases()
files()
annotations()
pquery = projects()
The pquery
object is now an object of (S3) class, GDCQuery
(and gdc_projects
and list
). The object contains the following elements:
projects()
function, the default fields from the GDC are used (see default_fields()
)filter()
method and will be used to filter results on retrieval.aggregations()
.Looking at the actual object (get used to using str()
!), note that the query contains no results.
str(pquery)
## List of 5
## $ fields : chr [1:10] "dbgap_accession_number" "disease_type" "intended_release_date" "name" ...
## $ filters: NULL
## $ facets : NULL
## $ legacy : logi FALSE
## $ expand : NULL
## - attr(*, "class")= chr [1:3] "gdc_projects" "GDCQuery" "list"
[ GDC pagination documentation ]
With a query object available, the next step is to retrieve results from the GDC. The GenomicDataCommons package. The most basic type of results we can get is a simple count()
of records available that satisfy the filter criteria. Note that we have not set any filters, so a count()
here will represent all the project records publicly available at the GDC in the “default” archive"
pcount = count(pquery)
# or
pcount = pquery %>% count()
pcount
## [1] 40
The results()
method will fetch actual results.
presults = pquery %>% results()
These results are returned from the GDC in JSON format and converted into a (potentially nested) list in R. The str()
method is useful for taking a quick glimpse of the data.
str(presults)
## List of 8
## $ dbgap_accession_number: chr [1:10] NA NA NA NA ...
## $ disease_type :List of 10
## ..$ TCGA-UVM : chr "Uveal Melanoma"
## ..$ TCGA-STAD : chr "Stomach Adenocarcinoma"
## ..$ TCGA-LUSC : chr "Lung Squamous Cell Carcinoma"
## ..$ TCGA-UCEC : chr "Uterine Corpus Endometrial Carcinoma"
## ..$ TCGA-CHOL : chr "Cholangiocarcinoma"
## ..$ TCGA-OV : chr "Ovarian Serous Cystadenocarcinoma"
## ..$ TCGA-ACC : chr "Adrenocortical Carcinoma"
## ..$ TCGA-MESO : chr "Mesothelioma"
## ..$ TARGET-AML: chr "Acute Myeloid Leukemia"
## ..$ TCGA-LGG : chr "Brain Lower Grade Glioma"
## $ released : logi [1:10] TRUE TRUE TRUE TRUE TRUE TRUE ...
## $ state : chr [1:10] "legacy" "legacy" "legacy" "legacy" ...
## $ primary_site :List of 10
## ..$ TCGA-UVM : chr "Eye"
## ..$ TCGA-STAD : chr "Stomach"
## ..$ TCGA-LUSC : chr "Lung"
## ..$ TCGA-UCEC : chr "Uterus"
## ..$ TCGA-CHOL : chr "Bile Duct"
## ..$ TCGA-OV : chr "Ovary"
## ..$ TCGA-ACC : chr "Adrenal Gland"
## ..$ TCGA-MESO : chr "Pleura"
## ..$ TARGET-AML: chr "Blood"
## ..$ TCGA-LGG : chr "Brain"
## $ project_id : chr [1:10] "TCGA-UVM" "TCGA-STAD" "TCGA-LUSC" "TCGA-UCEC" ...
## $ id : chr [1:10] "TCGA-UVM" "TCGA-STAD" "TCGA-LUSC" "TCGA-UCEC" ...
## $ name : chr [1:10] "Uveal Melanoma" "Stomach Adenocarcinoma" "Lung Squamous Cell Carcinoma" "Uterine Corpus Endometrial Carcinoma" ...
## - attr(*, "row.names")= int [1:10] 1 2 3 4 5 6 7 8 9 10
## - attr(*, "class")= chr [1:3] "GDCprojectsResults" "GDCResults" "list"
A default of only 10 records are returned. We can use the size
and from
arguments to results()
to either page through results or to change the number of results. Finally, there is a convenience method, results_all()
that will simply fetch all the available results given a query. Note that results_all()
may take a long time and return HUGE result sets if not used carefully. Use of a combination of count()
and results()
to get a sense of the expected data size is probably warranted before calling results_all()
length(ids(presults))
## [1] 10
presults = pquery %>% results_all()
length(ids(presults))
## [1] 40
# includes all records
length(ids(presults)) == count(pquery)
## [1] TRUE
Extracting subsets of results or manipulating the results into a more conventional R data structure is not easily generalizable. However, the purrr, rlist, and data.tree packages are all potentially of interest for manipulating complex, nested list structures. For viewing the results in an interactive viewer, consider the listviewer package.
In the case of the projects
entity, the default results (using default fields, that is) can be simplified easily with as.data.frame
.
head(as.data.frame(presults))
Central to querying and retrieving data from the GDC is the ability to specify which fields to return, filtering by fields and values, and faceting or aggregating. The GenomicDataCommons package includes two simple functions, available_fields()
and default_fields()
. Each can operate on a character(1) endpoint name (“cases”, “files”, “annotations”, or “projects”) or a GDCQuery
object.
default_fields('files')
## [1] "access" "acl" "created_datetime"
## [4] "data_category" "data_format" "data_type"
## [7] "error_type" "experimental_strategy" "file_autocomplete"
## [10] "file_id" "file_name" "file_size"
## [13] "file_state" "md5sum" "origin"
## [16] "platform" "revision" "state"
## [19] "state_comment" "submitter_id" "tags"
## [22] "type" "updated_datetime"
# The number of fields available for files endpoint
length(available_fields('files'))
## [1] 592
# The first few fields available for files endpoint
head(available_fields('files'))
## [1] "access" "acl"
## [3] "analysis.analysis_id" "analysis.analysis_type"
## [5] "analysis.created_datetime" "analysis.input_files.access"
The fields to be returned by a query can be specified following a similar paradigm to that of the dplyr package. The select()
function is a verb that resets the fields slot of a GDCQuery
; note that this is not quite analogous to the dplyr select()
verb that limits from already-present fields. We completely replace the fields when using select()
on a GDCQuery
.
# Default fields here
qcases = cases()
qcases$fields
## [1] "aliquot_ids" "analyte_ids"
## [3] "case_autocomplete" "case_id"
## [5] "created_datetime" "days_to_index"
## [7] "days_to_lost_to_followup" "disease_type"
## [9] "index_date" "lost_to_followup"
## [11] "portion_ids" "primary_site"
## [13] "sample_ids" "slide_ids"
## [15] "state" "submitter_aliquot_ids"
## [17] "submitter_analyte_ids" "submitter_id"
## [19] "submitter_portion_ids" "submitter_sample_ids"
## [21] "submitter_slide_ids" "updated_datetime"
# set up query to use ALL available fields
# Note that checking of fields is done by select()
qcases = cases() %>% GenomicDataCommons::select(available_fields('cases'))
head(qcases$fields)
## [1] "case_id" "aliquot_ids"
## [3] "analyte_ids" "annotations.annotation_id"
## [5] "annotations.case_id" "annotations.case_submitter_id"
Finding fields of interest is such a common operation that the GenomicDataCommons includes the grep_fields()
function and the field_picker()
widget. See the appropriate help pages for details.
The GDC API offers a feature known as aggregation or faceting. By specifying one or more fields (of appropriate type), the GDC can return to us a count of the number of records matching each potential value. This is similar to the R table
method. Multiple fields can be returned at once, but the GDC API does not have a cross-tabulation feature; all aggregations are only on one field at a time. Results of aggregation()
calls come back as a list of data.frames (actually, tibbles).
# total number of files of a specific type
res = files() %>% facet(c('type','data_type')) %>% aggregations()
res$type
Using aggregations()
is an also easy way to learn the contents of individual fields and forms the basis for faceted search pages.
[ GDC filtering
documentation ]
The GenomicDataCommons package uses a form of non-standard evaluation to specify R-like queries that are then translated into an R list. That R list is, upon calling a method that fetches results from the GDC API, translated into the appropriate JSON string. The R expression uses the formula interface as suggested by Hadley Wickham in his vignette on non-standard evaluation
It’s best to use a formula because a formula captures both the expression to evaluate and the environment where the evaluation occurs. This is important if the expression is a mixture of variables in a data frame and objects in the local environment [for example].
For the user, these details will not be too important except to note that a filter expression must begin with a “~”.
qfiles = files()
qfiles %>% count() # all files
## [1] 310858
To limit the file type, we can refer back to the section on faceting to see the possible values for the file field “type”. For example, to filter file results to only “gene_expression” files, we simply specify a filter.
qfiles = files() %>% filter(~ type == 'gene_expression')
# here is what the filter looks like after translation
str(get_filter(qfiles))
## List of 2
## $ op :Classes 'scalar', 'character' chr "="
## $ content:List of 2
## ..$ field: chr "type"
## ..$ value: chr "gene_expression"
What if we want to create a filter based on the project (‘TCGA-OVCA’, for example)? Well, we have a couple of possible ways to discover available fields. The first is based on base R functionality and some intuition.
grep('pro',available_fields('files'),value=TRUE)
## [1] "cases.diagnoses.progression_free_survival"
## [2] "cases.diagnoses.progression_free_survival_event"
## [3] "cases.diagnoses.progression_or_recurrence"
## [4] "cases.project.dbgap_accession_number"
## [5] "cases.project.disease_type"
## [6] "cases.project.intended_release_date"
## [7] "cases.project.name"
## [8] "cases.project.primary_site"
## [9] "cases.project.program.dbgap_accession_number"
## [10] "cases.project.program.name"
## [11] "cases.project.program.program_id"
## [12] "cases.project.project_id"
## [13] "cases.project.releasable"
## [14] "cases.project.released"
## [15] "cases.project.state"
## [16] "cases.samples.days_to_sample_procurement"
## [17] "cases.samples.method_of_sample_procurement"
## [18] "cases.samples.portions.slides.number_proliferating_cells"
## [19] "cases.tissue_source_site.project"
Interestingly, the project information is “nested” inside the case. We don’t need to know that detail other than to know that we now have a few potential guesses for where our information might be in the files records. We need to know where because we need to construct the appropriate filter.
files() %>% facet('cases.project.project_id') %>% aggregations()
## $cases.project.project_id
## key doc_count
## 1 FM-AD 36134
## 2 TCGA-BRCA 27207
## 3 TCGA-LUAD 14804
## 4 TCGA-UCEC 13604
## 5 TCGA-LUSC 13124
## 6 TCGA-HNSC 12895
## 7 TCGA-LGG 12603
## 8 TCGA-THCA 12703
## 9 TCGA-OV 13054
## 10 TCGA-PRAD 12568
## 11 TCGA-COAD 11824
## 12 TCGA-SKCM 11265
## 13 TCGA-KIRC 12272
## 14 TCGA-STAD 10731
## 15 TCGA-BLCA 10193
## 16 TCGA-GBM 9657
## 17 TCGA-LIHC 9511
## 18 TCGA-CESC 7349
## 19 TCGA-KIRP 7368
## 20 TCGA-SARC 6282
## 21 TCGA-ESCA 4473
## 22 TCGA-PAAD 4433
## 23 TCGA-PCPG 4422
## 24 TCGA-READ 4012
## 25 TCGA-LAML 3954
## 26 TCGA-TGCT 3636
## 27 TARGET-NBL 2806
## 28 TCGA-THYM 2974
## 29 TARGET-AML 1873
## 30 TCGA-ACC 2108
## 31 TARGET-WT 1324
## 32 TCGA-MESO 2050
## 33 TCGA-UVM 1928
## 34 TCGA-KICH 1853
## 35 TCGA-UCS 1364
## 36 TCGA-CHOL 1157
## 37 TCGA-DLBC 1163
## 38 TARGET-OS 4
## 39 TARGET-RT 174
## 40 TARGET-CCSK 2
We note that cases.project.project_id
looks like it is a good fit. We also note that TCGA-OV
is the correct project_id, not TCGA-OVCA
. Note that unlike with dplyr and friends, the filter()
method here replaces the filter and does not build on any previous filters.
qfiles = files() %>% filter( ~ cases.project.project_id == 'TCGA-OV' & type == 'gene_expression')
str(get_filter(qfiles))
## List of 2
## $ op :Classes 'scalar', 'character' chr "and"
## $ content:List of 2
## ..$ :List of 2
## .. ..$ op :Classes 'scalar', 'character' chr "="
## .. ..$ content:List of 2
## .. .. ..$ field: chr "cases.project.project_id"
## .. .. ..$ value: chr "TCGA-OV"
## ..$ :List of 2
## .. ..$ op :Classes 'scalar', 'character' chr "="
## .. ..$ content:List of 2
## .. .. ..$ field: chr "type"
## .. .. ..$ value: chr "gene_expression"
qfiles %>% count()
## [1] 1137
Asking for a count()
of results given these new filter criteria gives 1137 results. Generating a manifest for bulk downloads is as simple as asking for the manifest from the current query.
manifest_df = qfiles %>% manifest()
head(manifest_df)
Note that we might still not be quite there. Looking at filenames, there are suspiciously named files that might include “FPKM”, “FPKM-UQ”, or “counts”. Another round of grep
and available_fields
, looking for “type” turned up that the field “analysis.workflow_type” has the appropriate filter criteria.
qfiles = files() %>% filter( ~ cases.project.project_id == 'TCGA-OV' &
type == 'gene_expression' &
analysis.workflow_type == 'HTSeq - Counts')
manifest_df = qfiles %>% manifest()
nrow(manifest_df)
## [1] 379
The GDC Data Transfer Tool can be used (from R, transfer()
or from the command-line) to orchestrate high-performance, restartable transfers of all the files in the manifest. See the bulk downloads section for details.
[ GDC authentication documentation ]
The GDC offers both “controlled-access” and “open” data. As of this writing, only data stored as files is “controlled-access”; that is, metadata accessible via the GDC is all “open” data and some files are “open” and some are “controlled-access”. Controlled-access data are only available after going through the process of obtaining access.
After controlled-access to one or more datasets has been granted, logging into the GDC web portal will allow you to access a GDC authentication token, which can be downloaded and then used to access available controlled-access data via the GenomicDataCommons package.
The GenomicDataCommons uses authentication tokens only for downloading data (see transfer
and gdcdata
documentation). The package includes a helper function, gdc_token
, that looks for the token to be stored in one of three ways (resolved in this order):
GDC_TOKEN
GDC_TOKEN_FILE
.gdc_token
As a concrete example:
token = gdc_token()
transfer(...,token=token)
# or
transfer(...,token=get_token())
The gdcdata
function takes a character vector of one or more file ids. A simple way of producing such a vector is to produce a manifest
data frame and then pass in the first column, which will contain file ids.
fnames = gdcdata(manifest_df$id[1:2],progress=FALSE)
Note that for controlled-access data, a GDC authentication token is required. Using the BiocParallel
package may be useful for downloading in parallel, particularly for large numbers of smallish files.
The bulk download functionality is only efficient (as of v1.2.0 of the GDC Data Transfer Tool) for relatively large files, so use this approach only when transferring BAM files or larger VCF files, for example. Otherwise, consider using the approach shown above, perhaps in parallel.
mfile = tempfile()
write.table(manifest_df[1:50,],mfile,
col.names=TRUE, row.names=FALSE, quote=FALSE,sep="\t")
transfer(mfile,gdc_client='gdc-client')
## [1] "/tmp/Rtmpc94Mpv/filef5b2101d0c2"
res = cases() %>% facet("project.project_id") %>% aggregations()
head(res)
## $project.project_id
## key doc_count
## 1 FM-AD 18004
## 2 TARGET-NBL 1127
## 3 TCGA-BRCA 1098
## 4 TARGET-AML 988
## 5 TARGET-WT 652
## 6 TCGA-GBM 617
## 7 TCGA-OV 608
## 8 TCGA-LUAD 585
## 9 TCGA-UCEC 560
## 10 TCGA-KIRC 537
## 11 TCGA-HNSC 528
## 12 TCGA-LGG 516
## 13 TCGA-THCA 507
## 14 TCGA-LUSC 504
## 15 TCGA-PRAD 500
## 16 TCGA-SKCM 470
## 17 TCGA-COAD 461
## 18 TCGA-STAD 443
## 19 TCGA-BLCA 412
## 20 TARGET-OS 381
## 21 TCGA-LIHC 377
## 22 TCGA-CESC 307
## 23 TCGA-KIRP 291
## 24 TCGA-SARC 261
## 25 TCGA-LAML 200
## 26 TCGA-ESCA 185
## 27 TCGA-PAAD 185
## 28 TCGA-PCPG 179
## 29 TCGA-READ 172
## 30 TCGA-TGCT 150
## 31 TCGA-THYM 124
## 32 TCGA-KICH 113
## 33 TCGA-ACC 92
## 34 TCGA-MESO 87
## 35 TCGA-UVM 80
## 36 TARGET-RT 75
## 37 TCGA-DLBC 58
## 38 TCGA-UCS 57
## 39 TCGA-CHOL 51
## 40 TARGET-CCSK 13
library(ggplot2)
ggplot(res$project.project_id,aes(x = key, y = doc_count)) +
geom_bar(stat='identity') +
theme(axis.text.x = element_text(angle = 45, hjust = 1))
cases() %>% filter(~ project.program.name=='TARGET') %>% count()
## [1] 3236
cases() %>% filter(~ project.program.name=='TCGA') %>% count()
## [1] 11315
# The need to do the "&" here is a requirement of the
# current version of the GDC API. I have filed a feature
# request to remove this requirement.
resp = cases() %>% filter(~ project.project_id=='TCGA-BRCA' &
project.project_id=='TCGA-BRCA' ) %>%
facet('samples.sample_type') %>% aggregations()
resp$samples.sample_type
# The need to do the "&" here is a requirement of the
# current version of the GDC API. I have filed a feature
# request to remove this requirement.
resp = cases() %>% filter(~ project.project_id=='TCGA-BRCA' &
samples.sample_type=='Solid Tissue Normal') %>%
GenomicDataCommons::select(c(default_fields(cases()),'samples.sample_type')) %>%
response_all()
count(resp)
## [1] 162
res = resp %>% results()
str(res[1],list.len=6)
## List of 1
## $ updated_datetime: chr [1:162] "2017-03-04T16:39:19.244769-06:00" "2017-03-04T16:39:19.244769-06:00" "2017-03-04T16:39:19.244769-06:00" "2017-03-04T16:39:19.244769-06:00" ...
head(ids(resp))
## [1] "b2aac45b-2073-4c7a-adb9-769a4fdcc111"
## [2] "6fa2a667-9c36-4526-8a58-1975e863a806"
## [3] "a851ca14-7bbf-455b-a054-ec03979a4247"
## [4] "79126e88-9cf8-45ff-bf91-a98da3b304d7"
## [5] "30ec8b1f-28c4-4f46-8a1b-a8d51e558c7d"
## [6] "d9627184-b972-4e00-8c11-b0b946ac357a"
res = files() %>% facet('type') %>% aggregations()
res$type
ggplot(res$type,aes(x = key,y = doc_count)) + geom_bar(stat='identity') +
theme(axis.text.x = element_text(angle = 45, hjust = 1))
q = files() %>%
GenomicDataCommons::select(available_fields('files')) %>%
filter(~ cases.project.project_id=='TCGA-GBM' &
data_type=='Gene Expression Quantification')
q %>% facet('analysis.workflow_type') %>% aggregations()
## $analysis.workflow_type
## key doc_count
## 1 HTSeq - Counts 174
## 2 HTSeq - FPKM 174
## 3 HTSeq - FPKM-UQ 174
# so need to add another filter
file_ids = q %>% filter(~ cases.project.project_id=='TCGA-GBM' &
data_type=='Gene Expression Quantification' &
analysis.workflow_type == 'HTSeq - Counts') %>%
GenomicDataCommons::select('file_id') %>%
response_all() %>%
ids()
I need to figure out how to do slicing reproducibly in a testing environment and for vignette building.
q = files() %>%
GenomicDataCommons::select(available_fields('files')) %>%
filter(~ cases.project.project_id == 'TCGA-GBM' &
data_type == 'Aligned Reads' &
experimental_strategy == 'RNA-Seq' &
data_format == 'BAM')
file_ids = q %>% response_all() %>% ids()
bamfile = slicing(file_ids[1],regions="chr12:6534405-6538375",token=gdc_token())
library(GenomicAlignments)
aligns = readGAlignments(bamfile)
Symptom: Trying to connect to the API results in:
Error in curl::curl_fetch_memory(url, handle = handle) :
SSL connect error
openssl
to version 1.0.1 or later.
openssl
, reinstall the R curl
and httr
packages.sessionInfo()
## R version 3.4.2 (2017-09-28)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 16.04.3 LTS
##
## Matrix products: default
## BLAS: /home/biocbuild/bbs-3.6-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.6-bioc/R/lib/libRlapack.so
##
## locale:
## [1] LC_CTYPE=en_US.UTF-8 LC_NUMERIC=C
## [3] LC_TIME=en_US.UTF-8 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] stats graphics grDevices utils datasets methods base
##
## other attached packages:
## [1] ggplot2_2.2.1 DT_0.2
## [3] GenomicDataCommons_1.2.0 magrittr_1.5
## [5] knitr_1.17 BiocStyle_2.6.0
##
## loaded via a namespace (and not attached):
## [1] Rcpp_0.12.13 plyr_1.8.4 compiler_3.4.2
## [4] GenomeInfoDb_1.14.0 XVector_0.18.0 bitops_1.0-6
## [7] tools_3.4.2 zlibbioc_1.24.0 digest_0.6.12
## [10] gtable_0.2.0 jsonlite_1.5 evaluate_0.10.1
## [13] tibble_1.3.4 rlang_0.1.2 curl_3.0
## [16] yaml_2.1.14 parallel_3.4.2 GenomeInfoDbData_0.99.1
## [19] stringr_1.2.0 httr_1.3.1 xml2_1.1.1
## [22] S4Vectors_0.16.0 htmlwidgets_0.9 IRanges_2.12.0
## [25] hms_0.3 grid_3.4.2 stats4_3.4.2
## [28] rprojroot_1.2 data.table_1.10.4-3 R6_2.2.2
## [31] rmarkdown_1.6 bookdown_0.5 readr_1.1.1
## [34] scales_0.5.0 backports_1.1.1 htmltools_0.3.6
## [37] BiocGenerics_0.24.0 GenomicRanges_1.30.0 colorspace_1.3-2
## [40] labeling_0.3 stringi_1.1.5 munsell_0.4.3
## [43] RCurl_1.95-4.8 lazyeval_0.2.1
S3
object-oriented programming paradigm is used.