inst/shiny/steplist_creator/R/upload.R

#' Check steplist upload file type
#'
#' Checks if the file uploaded into the Steplist Creator `shiny` app is a .rds
#' file.
#'
#' @param x Input of the fileInput UI element, e.g., input$upload.
#'
#' @noRd
check_if_rds <- function(x) {
  req(x)

  ext <- tools::file_ext(x$name)

  if (ext != "rds") {
    shinyalert::shinyalert(title = "Warning!", text = "Please upload an .rds file.", type = "warning")
  }

  validate(
    need(ext == "rds", "Unsupported file type. Please upload an .rds file.")
  )
}

#' Check steplist upload class and structure
#'
#' Checks if the file uploaded into the Steplist Creator `shiny` app has the
#' correct class `epicmodel_steplist` and the correct structure using
#' `validate_steplist()`.
#'
#' @param x The uploaded file after reading it with `readRDS()`.
#'
#' @noRd
check_if_steplist <- function(x) {
  tryCatch({
    epicmodel::validate_steplist(x)
  }, error = function(e) {
    shinyalert::shinyalert(title = "Warning!", text = "The selected file is an .rds file but does not contain an object of class epicmodel_steplist.", type = "warning")
    validate(
      need(FALSE, paste("File validation error:", e$message))
    )
  })
}

Try the epicmodel package in your browser

Any scripts or data that you put into this service are public.

epicmodel documentation built on April 12, 2025, 1:59 a.m.