Browse code

modules in shinyApp

pablo-rodr-bio2 authored on 12/04/2021 19:45:21
Showing 2 changed files

... ...
@@ -9,7 +9,6 @@ plot2_Server <- function(id, eventData1, rv){
9 9
     function(input, output, session){
10 10
       
11 11
       output$plot2 <- renderPlotly({
12
-        # req(eventData1())
13 12
         rv$sample.c <- colnames(rv$gs)[eventData1()]
14 13
         data <- rv$dat.t[Sample==rv$sample.c]
15 14
         p <- ggplot(data = data, aes(x=value, color=Sample)) +
... ...
@@ -51,38 +51,5 @@ fluidPage(
51 51
               )
52 52
     ),
53 53
     argumentsDataUI("argumentsInput")
54
-    # column(
55
-    #   width=3,
56
-    #   conditionalPanel(
57
-    #     condition = "input.arg == 'yes'",
58
-    #     h3("Parameters"),
59
-    #     wellPanel(fluidRow(
60
-    #       column(
61
-    #         12,
62
-    #         selectInput("method", "Choose method:",
63
-    #                     c("gsva","ssgsea","zscore","plage")),
64
-    #         selectInput("kcdf", "Choose kcdf:",
65
-    #                     c("Gaussian","Poisson","none")),
66
-    #         radioButtons("absRanking", "abs.ranking:",
67
-    #                      c("False" = FALSE,
68
-    #                        "True" = TRUE)),
69
-    #         numericInput("minSz","min.sz:",value = 1),
70
-    #         numericInput("maxSz","max.sz (Write 0 for infinite):",value = 0),
71
-    #         radioButtons("mxDiff", "mx.diff:",
72
-    #                      c("True" = TRUE,
73
-    #                        "False" = FALSE)),
74
-    #         conditionalPanel(
75
-    #           condition = "input.method == 'gsva'", 
76
-    #           numericInput("tau1","tau:",value = 1)
77
-    #         ),
78
-    #         conditionalPanel(
79
-    #           condition = "input.method == 'ssgsea'",
80
-    #           numericInput("tau2","tau:",value = 0.25),
81
-    #           radioButtons("ssgseaNorm", "ssgsea.norm:",
82
-    #                        c("True" = TRUE,
83
-    #                          "False" = FALSE)))
84
-    #       )))
85
-    #   )
86
-    # )
87 54
   )
88 55
 )