Browse code

Fixing vignette

Tiago Silva authored on 05/05/2023 18:08:38
Showing 1 changed files

... ...
@@ -6,19 +6,19 @@ vignette: >
6 6
     %\VignetteEngine{knitr::rmarkdown}
7 7
     \usepackage[utf8]{inputenc}
8 8
 ---
9
-  
9
+
10 10
 ```{r setup, include=FALSE}
11 11
 knitr::opts_chunk$set(dpi = 300)
12 12
 knitr::opts_chunk$set(cache=FALSE)
13 13
 ```
14
-  
14
+
15 15
 ```{r message=FALSE, warning=FALSE, include=FALSE}
16 16
 library(TCGAbiolinks)
17 17
 library(SummarizedExperiment)
18 18
 library(dplyr)
19 19
 library(DT)
20 20
 ```
21
-  
21
+
22 22
 
23 23
 TCGAbiolinks retrieved molecular subtypes information from TCGA samples.
24 24
 The functions `PanCancerAtlas_subtypes` and `TCGAquery_subtype` can be used to get the information tables.
... ...
@@ -34,10 +34,12 @@ Synapse has published a single file with all available molecular subtypes that h
34 34
 
35 35
 ```{r message=FALSE, warning=FALSE}
36 36
 subtypes <- PanCancerAtlas_subtypes()
37
-DT::datatable(subtypes,
38
-             filter = 'top',
39
-             options = list(scrollX = TRUE, keys = TRUE, pageLength = 5),
40
-             rownames = FALSE)
37
+DT::datatable(
38
+    data = subtypes,
39
+    filter = 'top',
40
+    options = list(scrollX = TRUE, keys = TRUE, pageLength = 5),
41
+    rownames = FALSE
42
+)
41 43
 ```
42 44
 
43 45
 The columns "Subtype_Selected" was selected as most prominent subtype classification (from the other columns)
... ...
@@ -105,18 +107,18 @@ These subtypes will be automatically added in the summarizedExperiment
105 107
 object through GDCprepare. But you can also use the `TCGAquery_subtype` function
106 108
 to retrieve this information.
107 109
 
108
-```{r, eval = FALSE}
110
+```{r, eval = TRUE}
109 111
 lgg.gbm.subtype <- TCGAquery_subtype(tumor = "lgg")
110 112
 ```
111 113
 
112 114
 A subset of the LGG subytpe is shown below:
113 115
 ```{r, eval = TRUE, echo = FALSE}
114 116
 datatable(
115
-  lgg.gbm.subtype[1:10,],
116
-  caption = "Table with LGG molecular subtypes from TCGAquery_subtype",
117
-  filter = 'top',
118
-  options = list(scrollX = TRUE, keys = TRUE, pageLength = 5), 
119
-  rownames = FALSE
117
+    lgg.gbm.subtype[1:10,],
118
+    caption = "Table with LGG molecular subtypes from TCGAquery_subtype",
119
+    filter = 'top',
120
+    options = list(scrollX = TRUE, keys = TRUE, pageLength = 5), 
121
+    rownames = FALSE
120 122
 )
121 123
 ```
122 124