R/barplot_ui.R

Defines functions barplot_ui

Documented in barplot_ui

#' Barplot UI
#'
#' @param id Module ID
#' @param title A string
#' @param barplot_html A string that is HTML
#' @param ... Arguments passed to barplot_ui
#'
#' @export
barplot_ui <- function(
  id,
  title = "",
  barplot_html = htmltools::includeMarkdown(get_markdown_path("barchart1")),
  ...
){

  ns <- shiny::NS(id)

  shiny::tagList(
    titleBox(title),
    messageBox(
      width = 12,
      barplot_html
    ),
    shiny::conditionalPanel(
      condition = "output.display_feature_class_selection_ui",
      ns = ns,
      shiny::fluidRow(
        optionsBox(
          width = 12,
          shiny::column(
            width = 12,
            shiny::uiOutput(ns("feature_class_selection_ui"))
          )
        )
      )
    ),
    barplot_ui2(ns("barplot"), ...)
  )
}
CRI-iAtlas/iatlas.modules documentation built on Aug. 8, 2024, 12:53 a.m.