Browse code

feature name for TMT profile plots

deril2605 authored on 26/04/2024 13:53:38
Showing 2 changed files

... ...
@@ -164,6 +164,7 @@ qcServer <- function(input, output, session,parent_session, loadpage_input,get_d
164 164
       if(loadpage_input()$DDA_DIA == "TMT"){
165 165
         plot <- dataProcessPlotsTMT(preprocess_data(),
166 166
                             type=input$type1,
167
+                            featureName = input$fname,
167 168
                             ylimUp = FALSE,
168 169
                             ylimDown = FALSE,
169 170
                             which.Protein = protein,
... ...
@@ -236,7 +236,7 @@ qcUI <- function(id) {
236 236
                           #                  tags$br(),
237 237
                           #                  tags$h4("Calculation in progress...")),
238 238
                           uiOutput(ns("showplot")),
239
-                          disabled(downloadButton(ns("saveplot"), "Save this plot"))
239
+                          # disabled(downloadButton(ns("saveplot"), "Save this plot"))
240 240
                  ),
241 241
                  tabPanel("Download Data", 
242 242
                           #verbatimTextOutput('effect'),