Browse code

modified imports in igsva()

pablo-rodr-bio2 authored on 19/04/2021 11:20:20
Showing 3 changed files

... ...
@@ -10,7 +10,7 @@ Imports: methods, stats, utils, graphics, S4Vectors, IRanges,
10 10
          Biobase, SummarizedExperiment, GSEABase, Matrix, parallel,
11 11
          BiocParallel, SingleCellExperiment, sparseMatrixStats, DelayedArray,
12 12
          DelayedMatrixStats, HDF5Array, BiocSingular
13
-Suggests: BiocGenerics, RUnit, BiocStyle, knitr, markdown, limma, RColorBrewer,
13
+Suggests: BiocGenerics, RUnit, BiocStyle, knitr, rmarkdown, limma, RColorBrewer,
14 14
           genefilter, edgeR, GSVAdata, shiny, shinythemes, ggplot2, data.table,
15 15
           plotly, shinyjs, future, promises, shinybusy, org.Hs.eg.db
16 16
 Description: Gene Set Variation Analysis (GSVA) is a non-parametric, unsupervised method for estimating variation of gene set enrichment through the samples of a expression data set. GSVA performs a change in coordinate systems, transforming the data from a gene by sample matrix to a gene-set by sample matrix, thereby allowing the evaluation of pathway enrichment for each sample. This new matrix of GSVA enrichment scores facilitates applying standard analytical methods like functional enrichment, survival analysis, clustering, CNV-pathway analysis or cross-tissue pathway analysis, in a pathway-centric manner.
... ...
@@ -8,40 +8,41 @@ igsva <- function() {
8 8
     stop(sprintf("Please install the following packages to use the GSVA WebApp:\n\n  %s\n",
9 9
                  paste(shinydeps[!maskshinydeps], collapse=", ")))
10 10
   
11
-  namespaceImportFrom(self=getNamespace("base"),
12
-                      ns=getNamespace("shiny"))
13
-
14
-  namespaceImportFrom(self=getNamespace("base"),
15
-                      ns=getNamespace("shinythemes"),
16
-                      vars="shinytheme")
17
-
18
-  namespaceImportFrom(self=getNamespace("base"),
19
-                      ns=getNamespace("ggplot2"),
20
-                      vars="ggplot")
21
-
22
-  namespaceImportFrom(self=getNamespace("base"),
23
-                      ns=getNamespace("data.table"))
24
-
25
-  namespaceImportFrom(self=getNamespace("base"),
26
-                      ns=getNamespace("plotly"),
27
-                      vars=c("ggplotly", "event_data", "style"))
28
-
29
-  namespaceImportFrom(self=getNamespace("base"),
30
-                      ns=getNamespace("future"))
31
-
32
-  namespaceImportFrom(self=getNamespace("base"),
33
-                      ns=getNamespace("shinyjs"))
34
-
35
-  namespaceImportFrom(self=getNamespace("base"),
36
-                      ns=getNamespace("shinybusy"))
37
-
38
-  namespaceImportFrom(self=getNamespace("base"),
39
-                      ns=getNamespace("limma"))
11
+  # namespaceImportFrom(self=getNamespace("base"),
12
+  #                     ns=getNamespace("shiny"))
13
+  # 
14
+  # namespaceImportFrom(self=getNamespace("base"),
15
+  #                     ns=getNamespace("shinythemes"),
16
+  #                     vars="shinytheme")
17
+  # 
18
+  # namespaceImportFrom(self=getNamespace("base"),
19
+  #                     ns=getNamespace("ggplot2"),
20
+  #                     vars="ggplot")
21
+  # 
22
+  # namespaceImportFrom(self=getNamespace("base"),
23
+  #                     ns=getNamespace("data.table"))
24
+  # 
25
+  # namespaceImportFrom(self=getNamespace("base"),
26
+  #                     ns=getNamespace("plotly"),
27
+  #                     vars=c("ggplotly", "event_data", "style"))
28
+  # 
29
+  # namespaceImportFrom(self=getNamespace("base"),
30
+  #                     ns=getNamespace("future"))
31
+  # 
32
+  # namespaceImportFrom(self=getNamespace("base"),
33
+  #                     ns=getNamespace("shinyjs"))
34
+  # 
35
+  # namespaceImportFrom(self=getNamespace("base"),
36
+  #                     ns=getNamespace("shinybusy"))
37
+  # 
38
+  # namespaceImportFrom(self=getNamespace("base"),
39
+  #                     ns=getNamespace("limma"))
40 40
 
41 41
   appDir <- system.file("shinyApp", package="GSVA")
42 42
   if (appDir == "")
43 43
     stop("The GSVA Shiny app cannot be found within the package.")
44 44
 
45
-  runWebApp <- get("runApp", mode="function")
46
-  runWebApp(appDir)
45
+  # runWebApp <- get("runApp", mode="function")
46
+  # runWebApp(appDir)
47
+  shiny::runApp(appDir)
47 48
 }
... ...
@@ -41,6 +41,8 @@ function(input, output, session) {
41 41
     rv$gs <- NULL
42 42
     rv$dat.t <- NULL
43 43
     rv$p <- NULL
44
+    rv$p2 <- NULL
45
+    rv$p3 <- NULL
44 46
     rv$errors.gsva = NULL
45 47
     rv$matrix <- isolate(matrix())
46 48
     rv$genesets <- isolate(genesets())