inst/shiny/modules/manual.R

# Module globals
# NONE

# User interface
manualUI <- function(id)
{
  ns <- NS(id)

  tagList(
    div(style = "margin-top: 15px"),
    box(
      width = 12,
      title = "Manual",
      solidHeader = FALSE,
      collapsible = TRUE,
      status = "primary",
      tags$iframe(style = "height:900px; width:100%; border: none",
                  src = "./www/pdf/HIV_Estimates_Accuracy_manual.pdf#zoom=100")
    )
  )

}

# Server logic
manual <- function(input, output, session)
{

}
nextpagesoft/hivEstimatesAccuracy documentation built on Sept. 17, 2024, 5 a.m.