Browse code

fix skyline selector bug

devonjkohler authored on 30/05/2024 14:37:01
Showing 1 changed files

... ...
@@ -107,15 +107,15 @@ qcServer <- function(input, output, session,parent_session, loadpage_input,get_d
107 107
     print("Inside render UI and getting input$type1")
108 108
     print(input$type1)
109 109
     if ((loadpage_input()$BIO!="PTM" && input$type1 == "QCPlot")) {
110
-      if((loadpage_input()$DDA_DIA=="LType" && loadpage_input()$filetype=="sky") || (loadpage_input()$DDA_DIA=="LType" && loadpage_input()$filetype=="ump")){
111
-        selectizeInput(ns("which"), "Show plot for", 
112
-                       choices = c("", "ALL PROTEINS" = "allonly", 
113
-                                   unique(get_data()[2])))
114
-      } else {
115
-        selectizeInput(ns("which"), "Show plot for", 
116
-                       choices = c("", "ALL PROTEINS" = "allonly", 
117
-                                   unique(get_data()[1])))
118
-      }
110
+      # if((loadpage_input()$DDA_DIA=="LType" && loadpage_input()$filetype=="sky") || (loadpage_input()$DDA_DIA=="LType" && loadpage_input()$filetype=="ump")){
111
+      #   selectizeInput(ns("which"), "Show plot for", 
112
+      #                  choices = c("", "ALL PROTEINS" = "allonly", 
113
+      #                              unique(get_data()[2])))
114
+      # } else {
115
+      selectizeInput(ns("which"), "Show plot for", 
116
+                     choices = c("", "ALL PROTEINS" = "allonly", 
117
+                                 unique(get_data()[1])))
118
+      # }
119 119
     } else if (loadpage_input()$BIO == "PTM"){
120 120
       if (input$type1 == "QCPlot"){
121 121
         selectizeInput(ns("which"), "Show plot for",