inst/shiny/demo/ui.R

library(shiny)
library(shinyauthr)
library(shinythemes)
library(shinycssloaders)
library(shinyjs)
library(shinyTime)
library(shinytest)
library(ggplot2)
library(ggdark)
library(ggthemes)
library(plotly)
library(normfluodbf)
library(foreign)
local({source(file.path("ui", "helpers.R"))})
#library(magick)
#library(reactable)


ui <- fluidPage(
  shinydisconnect::disconnectMessage2(),
  shinyjs::useShinyjs(),
  tags$head(
    shinythemes::themeSelector(),
    tags$script(src = "normfluodbf.js"),
    tags$link(href = "styles.css", rel = "stylesheet")
  ),

  div(id = "loading-content", "App Loading...",
      img(src = "waiting.gif")),

  shinyauthr::loginUI(id = "login"),

  uiOutput("app_ui")
)

Try the normfluodbf package in your browser

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

normfluodbf documentation built on Nov. 6, 2025, 1:12 a.m.