... | ... |
@@ -936,7 +936,7 @@ TCGAquery_recount2<-function(project, tissue=c()){ |
936 | 936 |
#' @description |
937 | 937 |
#' Retrieve open access ATAC-seq files from GDC server |
938 | 938 |
#' https://gdc.cancer.gov/about-data/publications/ATACseq-AWG |
939 |
-#' Manifest available at: https://gdc.cancer.gov/files/public/file/ATACseq-AWG_Open_GDC-Manifest.txt |
|
939 |
+#' Manifest available at: https://gdc.cancer.gov/system/files/public/file/ATACseq-AWG_Open_GDC-Manifest.txt |
|
940 | 940 |
#' @param tumor a valid tumor |
941 | 941 |
#' @param file.type Write maf file into a csv document |
942 | 942 |
#' @export |
... | ... |
@@ -955,7 +955,7 @@ GDCquery_ATAC_seq <- function( |
955 | 955 |
file.type = NULL |
956 | 956 |
) { |
957 | 957 |
isServeOK() |
958 |
- results <- readr::read_tsv("https://gdc.cancer.gov/files/public/file/ATACseq-AWG_Open_GDC-Manifest.txt") |
|
958 |
+ results <- readr::read_tsv("https://gdc.cancer.gov/system/files/public/file/ATACseq-AWG_Open_GDC-Manifest.txt") |
|
959 | 959 |
|
960 | 960 |
if(!is.null(tumor)) results <- results[grep(tumor,results$filename,ignore.case = TRUE),] |
961 | 961 |
if(!is.null(file.type)) results <- results[grep(file.type,results$filename,ignore.case = TRUE),] |
... | ... |
@@ -21,7 +21,7 @@ knitr::opts_knit$set(progress = FALSE) |
21 | 21 |
|
22 | 22 |
|
23 | 23 |
--- |
24 |
-```{r message=FALSE, warning=FALSE, include=FALSE} |
|
24 |
+```{r libs, message=FALSE, warning=FALSE, include=FALSE} |
|
25 | 25 |
library(TCGAbiolinks) |
26 | 26 |
library(SummarizedExperiment) |
27 | 27 |
library(dplyr) |
... | ... |
@@ -119,7 +119,7 @@ Please, note that these tables are still incomplete. |
119 | 119 |
|
120 | 120 |
## Harmonized data options |
121 | 121 |
|
122 |
-```{r, echo=FALSE} |
|
122 |
+```{r Harmonized_data_options, echo=FALSE} |
|
123 | 123 |
datatable( |
124 | 124 |
readr::read_csv("https://docs.google.com/spreadsheets/d/1f98kFdj9mxVDc1dv4xTZdx8iWgUiDYO-qiFJINvmTZs/export?format=csv&gid=2046985454",col_types = readr::cols()), |
125 | 125 |
filter = 'top', |
... | ... |
@@ -216,7 +216,7 @@ datatable( |
216 | 216 |
This example shows how the user can search for breast cancer Raw Sequencing Data ("Controlled") |
217 | 217 |
and verify the name of the files and the barcodes associated with it. |
218 | 218 |
|
219 |
-```{r message=FALSE, warning=FALSE} |
|
219 |
+```{r queries,message=FALSE, warning=FALSE} |
|
220 | 220 |
query <- GDCquery( |
221 | 221 |
project = "TCGA-ACC", |
222 | 222 |
data.category = "Sequencing Reads", |
... | ... |
@@ -299,8 +299,8 @@ datatable( |
299 | 299 |
If you want to get the manifest file from the query object you can use the function *getManifest*. If you |
300 | 300 |
set save to `TRUE` a txt file that can be used with GDC-client Data transfer tool (DTT) or with its GUI version [ddt-ui](https://github.com/NCI-GDC/dtt-ui) will be created. |
301 | 301 |
|
302 |
-```{r message=FALSE, warning=FALSE} |
|
303 |
-getManifest(query,save = FALSE) |
|
302 |
+```{r get_manifest, message = FALSE, warning = FALSE} |
|
303 |
+getManifest(query, save = FALSE) |
|
304 | 304 |
``` |
305 | 305 |
|
306 | 306 |
# ATAC-seq data |
... | ... |
@@ -310,7 +310,6 @@ Also, for more details, you can check an ATAC-seq workshop at http://rpubs.com/t |
310 | 310 |
|
311 | 311 |
The list of file available is below: |
312 | 312 |
```{r message=FALSE, warning=FALSE} |
313 |
- |
|
314 | 313 |
datatable( |
315 | 314 |
getResults(TCGAbiolinks:::GDCquery_ATAC_seq())[,c("file_name","file_size")], |
316 | 315 |
filter = 'top', |
... | ... |
@@ -320,13 +319,12 @@ datatable( |
320 | 319 |
``` |
321 | 320 |
|
322 | 321 |
You can use the function `GDCquery_ATAC_seq` filter the manifest table and use `GDCdownload` to save the data locally. |
323 |
-```{r message=FALSE, warning=FALSE,eval = FALSE} |
|
322 |
+```{r GDCquery_ATAC_seq, message=FALSE, warning=FALSE,eval = FALSE} |
|
324 | 323 |
query <- TCGAbiolinks:::GDCquery_ATAC_seq(file.type = "rds") |
325 | 324 |
GDCdownload(query, method = "client") |
326 | 325 |
|
327 | 326 |
query <- TCGAbiolinks:::GDCquery_ATAC_seq(file.type = "bigWigs") |
328 | 327 |
GDCdownload(query, method = "client") |
329 |
- |
|
330 | 328 |
``` |
331 | 329 |
|
332 | 330 |
# Summary of available files per patient |
... | ... |
@@ -334,7 +332,7 @@ GDCdownload(query, method = "client") |
334 | 332 |
Retrieve the numner of files under each data_category + data_type + experimental_strategy + platform. |
335 | 333 |
Almost like https://portal.gdc.cancer.gov/exploration |
336 | 334 |
|
337 |
-```{r message=FALSE, warning=FALSE,eval = TRUE} |
|
335 |
+```{r getSampleFilesSummary, message=FALSE, warning=FALSE,eval = TRUE} |
|
338 | 336 |
tab <- getSampleFilesSummary(project = "TCGA-ACC") |
339 | 337 |
datatable( |
340 | 338 |
head(tab), |