mirror of
https://github.com/rstudio/shiny.git
synced 2026-01-15 01:48:11 -05:00
47 lines
1.2 KiB
R
47 lines
1.2 KiB
R
library(shiny)
|
|
|
|
# Define UI for random distribution app ----
|
|
fluidPage(
|
|
|
|
# App title ----
|
|
titlePanel("Tabsets"),
|
|
|
|
# Sidebar layout with input and output definitions ----
|
|
sidebarLayout(
|
|
|
|
# Sidebar panel for inputs ----
|
|
sidebarPanel(
|
|
|
|
# Input: Select the random distribution type ----
|
|
radioButtons("dist", "Distribution type:",
|
|
c("Normal" = "norm",
|
|
"Uniform" = "unif",
|
|
"Log-normal" = "lnorm",
|
|
"Exponential" = "exp")),
|
|
|
|
# br() element to introduce extra vertical spacing ----
|
|
br(),
|
|
|
|
# Input: Slider for the number of observations to generate ----
|
|
sliderInput("n",
|
|
"Number of observations:",
|
|
value = 500,
|
|
min = 1,
|
|
max = 1000)
|
|
|
|
),
|
|
|
|
# Main panel for displaying outputs ----
|
|
mainPanel(
|
|
|
|
# Output: Tabset w/ plot, summary, and table ----
|
|
tabsetPanel(type = "tabs",
|
|
tabPanel("Plot", plotOutput("plot")),
|
|
tabPanel("Summary", verbatimTextOutput("summary")),
|
|
tabPanel("Table", tableOutput("table"))
|
|
)
|
|
|
|
)
|
|
)
|
|
)
|