R/module_export.R

Defines functions exportSamples_ui exportSamples_server

Documented in exportSamples_server exportSamples_ui

#' Export samples from database
#'
#' @param id id
#'
#' @return ui
#' @export
#'
exportSamples_ui <- function(id) {
  ns <- shiny::NS(id)
  
  tagList(
    
    div(align = "center",  
        h3("Save/Export Samples"),
        tags$hr(size = 20),
        tempRepo::databaseSelector_UI(ns("dbselector")),   
        tags$hr(size = 20),
        p("Move samples between boxes by clicking the sample's name
          and then an arrow. Samples in the right box will be exported."),
        tempRepo::sampleChooser_UI(ns("chooseNewDBSamples")),
        tags$hr(size = 20),
        actionButton(ns("selectOutDir"),
                     label = "Select where to save files to:"),
        verbatimTextOutput(ns("selectedDir"),
                           placeholder = FALSE),
        tags$hr(size = 20),
        actionButton(ns("exportSpectra"),
                     label = "Export spectra as mzML")
        
    )
  )
  
}




#' exportSamples_server
#'
#' @param input shiny
#' @param output shiny
#' @param session shiny
#' @param sqlDirectory sqlDirectory$sqlDirectory
#' @param availableExperiments  availableExperiments$db
#'
#' @return NA
#' @export
#'

exportSamples_server <- function(input,
                                 output,
                                 session,
                                 sqlDirectory,
                                 availableExperiments){
  
  selectedDB <-  shiny::callModule(tempRepo::databaseSelector_server,
                                   "dbselector",
                                   availableExperiments = availableExperiments,
                                   sqlDirectory = sqlDirectory,
                                   h3Label = "Select an existing experiment to export samples from:")
  
  
  
  chosenSamples <-  shiny::callModule(tempRepo::sampleChooser_server,
                                      "chooseNewDBSamples",
                                      pool = selectedDB$userDBCon,
                                      allSamples = TRUE,
                                      whetherProtein = FALSE)

  
  copyingDbPopup <- reactive({
    showModal(modalDialog(
      title = "Important message",
      glue::glue("When file-export is complete you can find the files at: /n",
                 {chosenDirectory$value}),
      br(),
      easyClose = FALSE, 
      size = "l",
      footer = ""))
  })
  
  
  chosenDirectory <- reactiveValues(value = NULL)
  
  observeEvent(input$selectOutDir, {
    chosenDirectory$value <- tempRepo::choose_dir()
    
  })
  output$selectedDir <- renderText({
    req(!is.null(chosenDirectory$value))
    chosenDirectory$value
    
  })
  
  
  observeEvent(input$exportSpectra, {
  
    req(class(selectedDB$userDBCon())[[1]] == "Pool")
    req(length(chosenSamples$chosen) > 0)
    req(dir.exists(chosenDirectory$value))
    
   tempRepo::exportmzML(userDBCon = selectedDB$userDBCon(),
             sampleIDs = chosenSamples$chosen,
             saveToDir = chosenDirectory$value)
  
  })
  
}
chasemc/tempRepo documentation built on May 28, 2019, 7:32 p.m.