get RNA-seq data from TCGA

library(TCGAbiolinks)
rna <- GDCquery(project = "TCGA-ACC",
data.category = "Transcriptome Profiling",
data.type='Gene Expression Quantification',
workflow.type='STAR - Counts')
GDCdownload(query, method = "api")
exp <- GDCprepare(query=rna)

Error

exp <- GDCprepare(query=rna)
|==========================================|100% Completed after 46 s
Error in vectbl_as_col_location():
! Can't subset columns past the end.
i Locations 2, 3, and 4 don't exist.
i There is only 1 column.
Run rlang::last_error() to see where the error occurred.
There were 50 or more warnings (use warnings() to see the first 50)
Backtrace:
x

  1. +-TCGAbiolinks::GDCprepare(query = rna)
  2. | -TCGAbiolinks:::readTranscriptomeProfiling(...)
  3. | +-base::suppressMessages(...)
  4. | | -base::withCallingHandlers(...)
  5. | -x %>% map_dfc(.f = function(y) y[, 2:4])
  6. -purrr::map_dfc(., .f = function(y) y[, 2:4])
  7. -purrr::map(.x, .f, ...)
  8. \-TCGAbiolinks .f(.x[[i]], ...)
    
  9.   +-y[, 2:4]
    
  10.   +-readr:::`[.spec_tbl_df`(y, , 2:4)
    
  11.   +-base::NextMethod(`[`)
    
  12.   \-tibble:::`[.tbl_df`(y, , 2:4)
    
  13.     \-tibble:::vectbl_as_col_location(...)
    
  14.       +-tibble:::subclass_col_index_errors(...)
    
  15.       | \-base::withCallingHandlers(...)
    
  16.       \-vctrs::vec_as_location(j, n, names)
    
  17.         \-vctrs `<fn>`()
    
  18.           \-vctrs:::stop_subscript_oob(...)
    
  19.             \-vctrs:::stop_subscript(...)
    
  20.               \-rlang::abort(...)
    

This topic was automatically closed 21 days after the last reply. New replies are no longer allowed.

If you have a query related to it or one of the replies, start a new topic and refer back with a link.