Contents

Installation

Please use the devel version of the AnVIL Bioconductor package.

library(cBioPortalData)
library(AnVIL)

Introduction

This vignette is for users / developers who would like to learn more about the available in cBioPortalData and possibly hit other endpoints in the cBioPortal API implementation. The functionality demonstrated here is used internally by the package to create integrative representations of study datasets.

API representation

Obtaining the cBioPortal API representation object

(cbio <- cBioPortal())
## service: cBioPortal
## tags(); use cbioportal$<tab completion>:
## # A tibble: 73 x 3
##    tag          operation               summary                                 
##    <chr>        <chr>                   <chr>                                   
##  1 Cancer Types getAllCancerTypesUsing… Get all cancer types                    
##  2 Cancer Types getCancerTypeUsingGET   Get a cancer type                       
##  3 Clinical At… fetchClinicalAttribute… Fetch clinical attributes               
##  4 Clinical At… getAllClinicalAttribut… Get all clinical attributes in the spec…
##  5 Clinical At… getAllClinicalAttribut… Get all clinical attributes             
##  6 Clinical At… getClinicalAttributeCo… Get counts for clinical attributes acco…
##  7 Clinical At… getClinicalAttributeIn… Get specified clinical attribute        
##  8 Clinical Da… fetchAllClinicalDataIn… Fetch clinical data by patient IDs or s…
##  9 Clinical Da… fetchClinicalDataUsing… Fetch clinical data by patient IDs or s…
## 10 Clinical Da… getAllClinicalDataInSt… Get all clinical data in a study        
## # … with 63 more rows
## tag values:
##   Cancer Types, Clinical Attributes, Clinical Data, Clinical Events,
##   Copy Number Segments, Discrete Copy Number Alterations, Gene Panels,
##   Generic Assays, Genes, Molecular Data, Molecular Profiles, Mutations,
##   Patients, Reference Genome Genes, Resource Data, Resource
##   Definitions, Sample Lists, Samples, Structural Variants, Studies,
##   Treatments
## schemas():
##   AlleleSpecificCopyNumber, AndedPatientTreatmentFilters,
##   AndedSampleTreatmentFilters, CancerStudy, CancerStudyTags
##   # ... with 66 more elements

Operations

Check available tags, operations, and descriptions as a tibble:

tags(cbio)
## # A tibble: 73 x 3
##    tag          operation               summary                                 
##    <chr>        <chr>                   <chr>                                   
##  1 Cancer Types getAllCancerTypesUsing… Get all cancer types                    
##  2 Cancer Types getCancerTypeUsingGET   Get a cancer type                       
##  3 Clinical At… fetchClinicalAttribute… Fetch clinical attributes               
##  4 Clinical At… getAllClinicalAttribut… Get all clinical attributes in the spec…
##  5 Clinical At… getAllClinicalAttribut… Get all clinical attributes             
##  6 Clinical At… getClinicalAttributeCo… Get counts for clinical attributes acco…
##  7 Clinical At… getClinicalAttributeIn… Get specified clinical attribute        
##  8 Clinical Da… fetchAllClinicalDataIn… Fetch clinical data by patient IDs or s…
##  9 Clinical Da… fetchClinicalDataUsing… Fetch clinical data by patient IDs or s…
## 10 Clinical Da… getAllClinicalDataInSt… Get all clinical data in a study        
## # … with 63 more rows
head(tags(cbio)$operation)
## [1] "getAllCancerTypesUsingGET"              
## [2] "getCancerTypeUsingGET"                  
## [3] "fetchClinicalAttributesUsingPOST"       
## [4] "getAllClinicalAttributesInStudyUsingGET"
## [5] "getAllClinicalAttributesUsingGET"       
## [6] "getClinicalAttributeCountsUsingPOST"

Searching through the API

searchOps(cbio, "clinical")
##  [1] "getAllClinicalAttributesUsingGET"            
##  [2] "getClinicalAttributeCountsUsingPOST"         
##  [3] "fetchClinicalAttributesUsingPOST"            
##  [4] "fetchClinicalDataUsingPOST"                  
##  [5] "getAllClinicalAttributesInStudyUsingGET"     
##  [6] "getClinicalAttributeInStudyUsingGET"         
##  [7] "getAllClinicalDataInStudyUsingGET"           
##  [8] "fetchAllClinicalDataInStudyUsingPOST"        
##  [9] "getAllClinicalEventsInStudyUsingGET"         
## [10] "getAllClinicalDataOfPatientInStudyUsingGET"  
## [11] "getAllClinicalEventsOfPatientInStudyUsingGET"
## [12] "getAllClinicalDataOfSampleInStudyUsingGET"

Studies

Get the list of studies available:

getStudies(cbio)
## # A tibble: 290 x 13
##    name  shortName description publicStudy pmid  citation groups status
##    <chr> <chr>     <chr>       <lgl>       <chr> <chr>    <chr>   <int>
##  1 Chol… Cholangi… Exome sequ… TRUE        2418… Chan-on… "PUBL…      0
##  2 Esop… ESCC (UC… Whole exom… TRUE        2468… Lin et … "PUBL…      0
##  3 Oral… Head & n… Comprehens… TRUE        2361… Pickeri… ""          0
##  4 Hepa… HCC (Ins… Whole-exom… TRUE        2582… Schulze… "PUBL…      0
##  5 Uvea… UM (QIMR) Whole-geno… TRUE        2668… Johanss… "PUBL…      0
##  6 Neur… NBL (AMC) Whole geno… TRUE        2236… Molenaa… "PUBL…      0
##  7 Naso… NPC (Sin… Whole exom… TRUE        2495… Lin et … "PUBL…      0
##  8 Thym… TET (NCI) Whole exom… TRUE        2497… Petrini… "PUBL…      0
##  9 Neur… NBL (Col… Whole-geno… TRUE        2646… Peifer … ""          0
## 10 Myel… MDS (Tok… Whole exom… TRUE        2190… Yoshida… ""          0
## # … with 280 more rows, and 5 more variables: importDate <chr>,
## #   allSampleCount <int>, studyId <chr>, cancerTypeId <chr>,
## #   referenceGenome <chr>

Clinical Data

Obtain the clinical data for a particular study:

clinicalData(cbio, "acc_tcga")
## # A tibble: 92 x 20
##    uniqueSampleKey uniquePatientKey sampleId patientId studyId CANCER_TYPE
##    <chr>           <chr>            <chr>    <chr>     <chr>   <chr>      
##  1 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  2 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  3 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  4 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  5 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  6 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  7 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  8 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
##  9 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
## 10 VENHQS1PUi1BNU… VENHQS1PUi1BNUp… TCGA-OR… TCGA-OR-… acc_tc… Adrenocort…
## # … with 82 more rows, and 14 more variables: CANCER_TYPE_DETAILED <chr>,
## #   DAYS_TO_COLLECTION <chr>, FRACTION_GENOME_ALTERED <chr>, IS_FFPE <chr>,
## #   MUTATION_COUNT <chr>, OCT_EMBEDDED <chr>, ONCOTREE_CODE <chr>,
## #   OTHER_SAMPLE_ID <chr>, PATHOLOGY_REPORT_FILE_NAME <chr>,
## #   PATHOLOGY_REPORT_UUID <chr>, SAMPLE_INITIAL_WEIGHT <chr>,
## #   SAMPLE_TYPE <chr>, SAMPLE_TYPE_ID <chr>, VIAL_NUMBER <chr>

Molecular Profiles

A table of molecular profiles for a particular study can be obtained by running the following:

mols <- molecularProfiles(cbio, "acc_tcga")
mols[["molecularProfileId"]]
## [1] "acc_tcga_rppa"                                     
## [2] "acc_tcga_rppa_Zscores"                             
## [3] "acc_tcga_gistic"                                   
## [4] "acc_tcga_rna_seq_v2_mrna"                          
## [5] "acc_tcga_rna_seq_v2_mrna_median_Zscores"           
## [6] "acc_tcga_linear_CNA"                               
## [7] "acc_tcga_methylation_hm450"                        
## [8] "acc_tcga_mutations"                                
## [9] "acc_tcga_rna_seq_v2_mrna_median_all_sample_Zscores"

Molecular Profile Data

The data for a molecular profile can be obtained with prior knowledge of available entrezGeneIds:

molecularData(cbio, molecularProfileId = "acc_tcga_rna_seq_v2_mrna",
    entrezGeneIds = c(1, 2),
    sampleIds = c("TCGA-OR-A5J1-01",  "TCGA-OR-A5J2-01")
)
## $acc_tcga_rna_seq_v2_mrna
## # A tibble: 4 x 8
##   uniqueSampleKey uniquePatientKey entrezGeneId molecularProfil… sampleId
##   <chr>           <chr>                   <int> <chr>            <chr>   
## 1 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…            1 acc_tcga_rna_se… TCGA-OR…
## 2 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…            2 acc_tcga_rna_se… TCGA-OR…
## 3 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…            1 acc_tcga_rna_se… TCGA-OR…
## 4 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…            2 acc_tcga_rna_se… TCGA-OR…
## # … with 3 more variables: patientId <chr>, studyId <chr>, value <dbl>

Genes

All available genes

A list of all the genes provided by the API service including hugo symbols, and entrez gene IDs can be obtained by using the geneTable function:

geneTable(cbio)
## # A tibble: 1,000 x 3
##    entrezGeneId hugoGeneSymbol type          
##           <int> <chr>          <chr>         
##  1       -95835 IVNS1ABP_PT330 phosphoprotein
##  2       -95834 IVNS1ABP_PT328 phosphoprotein
##  3       -95833 IVNS1ABP_PS329 phosphoprotein
##  4       -95832 IVNS1ABP_PS277 phosphoprotein
##  5       -95831 MORC2_PS785    phosphoprotein
##  6       -95830 MORC2_PS779    phosphoprotein
##  7       -95829 MORC2_PS777    phosphoprotein
##  8       -95828 MORC2_PS743    phosphoprotein
##  9       -95827 MORC2_PS739    phosphoprotein
## 10       -95826 MORC2_PS725    phosphoprotein
## # … with 990 more rows

Gene Panels

genePanels(cbio)
## # A tibble: 47 x 2
##    description                                                       genePanelId
##    <chr>                                                             <chr>      
##  1 Targeted (341 cancer genes) sequencing of various tumor types vi… IMPACT341  
##  2 Targeted (410 cancer genes) sequencing of various tumor types vi… IMPACT410  
##  3 Targeted (468 cancer genes) sequencing of various tumor types vi… IMPACT468  
##  4 Targeted sequencing of urcc tumor via MSK-IMPACT.                 IMPACT     
##  5 Targeted (300 cancer genes) sequencing of bladder urothelial car… IMPACT300  
##  6 Targeted deep sequencing (TDS) of 1202 genes on Illumina HiSeq20… UCLA_1202  
##  7 Targeted sequencing of urcc tumor via MSK-IMPACT.                 IMPACT230  
##  8 Targeted (27 cancer genes) sequencing of adenoid cystic carcinom… ACYC_FMI_27
##  9 Targeted (173 cancer genes) sequencing of breast cancers on Illu… METABRIC_1…
## 10 Targeted sequencing of 504 cancer-associated genes on Illumina H… DFCI_504   
## # … with 37 more rows
getGenePanel(cbio, "IMPACT341")
## # A tibble: 341 x 2
##    entrezGeneId hugoGeneSymbol
##           <int> <chr>         
##  1           25 ABL1          
##  2        84142 ABRAXAS1      
##  3          207 AKT1          
##  4          208 AKT2          
##  5        10000 AKT3          
##  6          238 ALK           
##  7          242 ALOX12B       
##  8       139285 AMER1         
##  9          324 APC           
## 10          367 AR            
## # … with 331 more rows

Molecular Gene Panels

genePanelMolecular

gprppa <- genePanelMolecular(cbio,
    molecularProfileId = "acc_tcga_rppa",
    sampleListId = "acc_tcga_all")
gprppa
## # A tibble: 92 x 7
##    uniqueSampleKey uniquePatientKey molecularProfil… sampleId patientId studyId
##    <chr>           <chr>            <chr>            <chr>    <chr>     <chr>  
##  1 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  2 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  3 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  4 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  5 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  6 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  7 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  8 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
##  9 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
## 10 VENHQS1PUi1BNU… VENHQS1PUi1BNUp… acc_tcga_rppa    TCGA-OR… TCGA-OR-… acc_tc…
## # … with 82 more rows, and 1 more variable: profiled <lgl>

getGenePanelMolecular

getGenePanelMolecular(cbio,
    molecularProfileIds = c("acc_tcga_rppa", "acc_tcga_gistic"),
    sampleIds = allSamples(cbio, "acc_tcga")$sampleId
)
## # A tibble: 184 x 7
##    uniqueSampleKey uniquePatientKey molecularProfil… sampleId patientId studyId
##    <chr>           <chr>            <chr>            <chr>    <chr>     <chr>  
##  1 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  2 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  3 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  4 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  5 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  6 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  7 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  8 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
##  9 VENHQS1PUi1BNU… VENHQS1PUi1BNUo… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
## 10 VENHQS1PUi1BNU… VENHQS1PUi1BNUp… acc_tcga_gistic  TCGA-OR… TCGA-OR-… acc_tc…
## # … with 174 more rows, and 1 more variable: profiled <lgl>

getDataByGenePanel

getDataByGenePanel(cbio, "acc_tcga", genePanelId = "IMPACT341",
    molecularProfileId = "acc_tcga_rppa", sampleListId = "acc_tcga_rppa")
## $acc_tcga_rppa
## # A tibble: 2,622 x 9
##    uniqueSampleKey uniquePatientKey entrezGeneId molecularProfil… sampleId
##    <chr>           <chr>                   <int> <chr>            <chr>   
##  1 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          207 acc_tcga_rppa    TCGA-OR…
##  2 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          208 acc_tcga_rppa    TCGA-OR…
##  3 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…        10000 acc_tcga_rppa    TCGA-OR…
##  4 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          367 acc_tcga_rppa    TCGA-OR…
##  5 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          472 acc_tcga_rppa    TCGA-OR…
##  6 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…         8314 acc_tcga_rppa    TCGA-OR…
##  7 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          596 acc_tcga_rppa    TCGA-OR…
##  8 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          598 acc_tcga_rppa    TCGA-OR…
##  9 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…        10018 acc_tcga_rppa    TCGA-OR…
## 10 VENHQS1PUi1BNU… VENHQS1PUi1BNUo…          673 acc_tcga_rppa    TCGA-OR…
## # … with 2,612 more rows, and 4 more variables: patientId <chr>, studyId <chr>,
## #   value <dbl>, hugoGeneSymbol <chr>

It uses the getAllGenesUsingGET function from the API.

Samples

Sample List Identifiers

To display all available sample list identifiers for a particular study ID, one can use the sampleLists function:

sampleLists(cbio, "acc_tcga")
## # A tibble: 9 x 5
##   category          name          description            sampleListId    studyId
##   <chr>             <chr>         <chr>                  <chr>           <chr>  
## 1 all_cases_with_r… Samples with… Samples protein data … acc_tcga_rppa   acc_tc…
## 2 all_cases_with_m… Samples with… Samples with mutation… acc_tcga_cnaseq acc_tc…
## 3 all_cases_in_stu… All samples   All samples (92 sampl… acc_tcga_all    acc_tc…
## 4 all_cases_with_c… Samples with… Samples with CNA data… acc_tcga_cna    acc_tc…
## 5 all_cases_with_m… Samples with… Samples with mutation… acc_tcga_seque… acc_tc…
## 6 all_cases_with_m… Samples with… Samples with methylat… acc_tcga_methy… acc_tc…
## 7 all_cases_with_m… Samples with… Samples with mRNA exp… acc_tcga_rna_s… acc_tc…
## 8 all_cases_with_m… Complete sam… Samples with mutation… acc_tcga_3way_… acc_tc…
## 9 all_cases_with_m… Samples with… Samples with methylat… acc_tcga_methy… acc_tc…

Sample Identifiers

One can obtain the barcodes / identifiers for each sample using a specific sample list identifier, in this case we want all the copy number alteration samples:

samplesInSampleLists(cbio, "acc_tcga_cna")
## CharacterList of length 1
## [["acc_tcga_cna"]] TCGA-OR-A5J1-01 TCGA-OR-A5J2-01 ... TCGA-PK-A5HC-01

This returns a CharacterList of all identifiers for each sample list identifier input:

samplesInSampleLists(cbio, c("acc_tcga_cna", "acc_tcga_cnaseq"))
## CharacterList of length 2
## [["acc_tcga_cna"]] TCGA-OR-A5J1-01 TCGA-OR-A5J2-01 ... TCGA-PK-A5HC-01
## [["acc_tcga_cnaseq"]] TCGA-OR-A5J1-01 TCGA-OR-A5J2-01 ... TCGA-PK-A5HC-01

All samples within a study ID

allSamples(cbio, "acc_tcga")
## # A tibble: 92 x 6
##    uniqueSampleKey    uniquePatientKey   sampleType  sampleId  patientId studyId
##    <chr>              <chr>              <chr>       <chr>     <chr>     <chr>  
##  1 VENHQS1PUi1BNUoxL… VENHQS1PUi1BNUoxO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  2 VENHQS1PUi1BNUoyL… VENHQS1PUi1BNUoyO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  3 VENHQS1PUi1BNUozL… VENHQS1PUi1BNUozO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  4 VENHQS1PUi1BNUo0L… VENHQS1PUi1BNUo0O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  5 VENHQS1PUi1BNUo1L… VENHQS1PUi1BNUo1O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  6 VENHQS1PUi1BNUo2L… VENHQS1PUi1BNUo2O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  7 VENHQS1PUi1BNUo3L… VENHQS1PUi1BNUo3O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  8 VENHQS1PUi1BNUo4L… VENHQS1PUi1BNUo4O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  9 VENHQS1PUi1BNUo5L… VENHQS1PUi1BNUo5O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
## 10 VENHQS1PUi1BNUpBL… VENHQS1PUi1BNUpBO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
## # … with 82 more rows

Info on Samples

getSampleInfo(cbio, studyId = "acc_tcga",
    sampleListIds = c("acc_tcga_rppa", "acc_tcga_gistic"))
## # A tibble: 46 x 6
##    uniqueSampleKey    uniquePatientKey   sampleType  sampleId  patientId studyId
##    <chr>              <chr>              <chr>       <chr>     <chr>     <chr>  
##  1 VENHQS1PUi1BNUoyL… VENHQS1PUi1BNUoyO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  2 VENHQS1PUi1BNUozL… VENHQS1PUi1BNUozO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  3 VENHQS1PUi1BNUo2L… VENHQS1PUi1BNUo2O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  4 VENHQS1PUi1BNUo3L… VENHQS1PUi1BNUo3O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  5 VENHQS1PUi1BNUo4L… VENHQS1PUi1BNUo4O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  6 VENHQS1PUi1BNUo5L… VENHQS1PUi1BNUo5O… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  7 VENHQS1PUi1BNUpBL… VENHQS1PUi1BNUpBO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  8 VENHQS1PUi1BNUpQL… VENHQS1PUi1BNUpQO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
##  9 VENHQS1PUi1BNUpSL… VENHQS1PUi1BNUpSO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
## 10 VENHQS1PUi1BNUpTL… VENHQS1PUi1BNUpTO… Primary So… TCGA-OR-… TCGA-OR-… acc_tc…
## # … with 36 more rows

Advanced Usage

The cBioPortal API representation is not limited to the functions provided in the package. Users who wish to make use of any of the endpoints provided by the API specification should use the dollar sign $ function to access the endpoints.

First the user should see the input for a particular endpoint as detailed in the API:

cbio$getGeneUsingGET
## getGeneUsingGET 
## Get a gene 
## 
## Parameters:
##   geneId (string)
##     Entrez Gene ID or Hugo Gene Symbol e.g. 1 or A1BG

Then the user can provide such input:

(resp <- cbio$getGeneUsingGET("BRCA1"))
## Response [https://www.cbioportal.org/api/genes/BRCA1]
##   Date: 2020-08-28 03:24
##   Status: 200
##   Content-Type: application/json
##   Size: 69 B

which will require the user to ‘translate’ the response using httr::content:

httr::content(resp)
## $entrezGeneId
## [1] 672
## 
## $hugoGeneSymbol
## [1] "BRCA1"
## 
## $type
## [1] "protein-coding"

Clearing the cache

For users who wish to clear the entire cBioPortalData cache, it is recommended that they use:

unlink("~/.cache/cBioPortalData/")

sessionInfo

sessionInfo()
## R version 4.0.2 (2020-06-22)
## Platform: x86_64-pc-linux-gnu (64-bit)
## Running under: Ubuntu 18.04.4 LTS
## 
## Matrix products: default
## BLAS:   /home/biocbuild/bbs-3.11-bioc/R/lib/libRblas.so
## LAPACK: /home/biocbuild/bbs-3.11-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] parallel  stats4    stats     graphics  grDevices utils     datasets 
## [8] methods   base     
## 
## other attached packages:
##  [1] cBioPortalData_2.0.10       MultiAssayExperiment_1.14.0
##  [3] SummarizedExperiment_1.18.2 DelayedArray_0.14.1        
##  [5] matrixStats_0.56.0          Biobase_2.48.0             
##  [7] GenomicRanges_1.40.0        GenomeInfoDb_1.24.2        
##  [9] IRanges_2.22.2              S4Vectors_0.26.1           
## [11] BiocGenerics_0.34.0         AnVIL_1.0.3                
## [13] dplyr_1.0.2                 BiocStyle_2.16.0           
## 
## loaded via a namespace (and not attached):
##  [1] bitops_1.0-6              bit64_4.0.2              
##  [3] progress_1.2.2            httr_1.4.2               
##  [5] GenomicDataCommons_1.12.0 tools_4.0.2              
##  [7] utf8_1.1.4                R6_2.4.1                 
##  [9] DBI_1.1.0                 tidyselect_1.1.0         
## [11] prettyunits_1.1.1         TCGAutils_1.8.0          
## [13] bit_4.0.4                 curl_4.3                 
## [15] compiler_4.0.2            cli_2.0.2                
## [17] rvest_0.3.6               formatR_1.7              
## [19] xml2_1.3.2                rtracklayer_1.48.0       
## [21] bookdown_0.20             readr_1.3.1              
## [23] askpass_1.1               rappdirs_0.3.1           
## [25] rapiclient_0.1.3          RCircos_1.2.1            
## [27] stringr_1.4.0             digest_0.6.25            
## [29] Rsamtools_2.4.0           rmarkdown_2.3            
## [31] XVector_0.28.0            pkgconfig_2.0.3          
## [33] htmltools_0.5.0           dbplyr_1.4.4             
## [35] limma_3.44.3              rlang_0.4.7              
## [37] RSQLite_2.2.0             generics_0.0.2           
## [39] jsonlite_1.7.0            BiocParallel_1.22.0      
## [41] RCurl_1.98-1.2            magrittr_1.5             
## [43] GenomeInfoDbData_1.2.3    futile.logger_1.4.3      
## [45] Matrix_1.2-18             fansi_0.4.1              
## [47] Rcpp_1.0.5                lifecycle_0.2.0          
## [49] stringi_1.4.6             yaml_2.2.1               
## [51] RaggedExperiment_1.12.0   RJSONIO_1.3-1.4          
## [53] zlibbioc_1.34.0           BiocFileCache_1.12.1     
## [55] grid_4.0.2                blob_1.2.1               
## [57] crayon_1.3.4              lattice_0.20-41          
## [59] Biostrings_2.56.0         splines_4.0.2            
## [61] GenomicFeatures_1.40.1    hms_0.5.3                
## [63] knitr_1.29                pillar_1.4.6             
## [65] codetools_0.2-16          biomaRt_2.44.1           
## [67] futile.options_1.0.1      XML_3.99-0.5             
## [69] glue_1.4.2                evaluate_0.14            
## [71] lambda.r_1.2.4            data.table_1.13.0        
## [73] BiocManager_1.30.10       vctrs_0.3.2              
## [75] openssl_1.4.2             purrr_0.3.4              
## [77] tidyr_1.1.2               assertthat_0.2.1         
## [79] xfun_0.16                 survival_3.2-3           
## [81] tibble_3.0.3              RTCGAToolbox_2.18.0      
## [83] GenomicAlignments_1.24.0  AnnotationDbi_1.50.3     
## [85] memoise_1.1.0             ellipsis_0.3.1