R/mod_techSpecsOutput.R

Defines functions mod_techSpecs mod_techSpecsOutput

Documented in mod_techSpecs mod_techSpecsOutput

#' @title mod_techSpecsOutput and mod_techSpecs
#'
#' @description Shiny module to show the technical specifications text
#'
#' @param id shiny id
#'
#' @export
mod_techSpecsOutput <- function(id) {
  # ns
  ns <- shiny::NS(id)
  shiny::tagList(
    shiny::uiOutput(ns('techSpecs'))
  )
}

#' mod_techSpecs server function
#'
#' @details mod_techSpecs generates the crossvalidations table
#' @param input internal
#' @param output internal
#' @param session internal
#'
#' @param lang lang selected
#'
#' @export
#'
#' @rdname mod_techSpecsOutput
mod_techSpecs <- function(
  input, output, session,
  lang
) {

  output$techSpecs <- shiny::renderUI({

    markdown_translated <- glue::glue(
      "fes_technical_specifications_{lang()}.md"
    )

    shiny::tagList(
      shiny::fluidPage(
        shiny::withMathJax(
          shiny::includeMarkdown(
            system.file('resources', markdown_translated, package = 'seboscapp')
          )
        )
      )
    )


  })

}
MalditoBarbudo/seboscapp documentation built on June 12, 2025, 4:23 p.m.