Terry Jones
11/13/2018
Introduction
Code
library(shiny)
shinyUI <- fluidPage(
titlePanel("Random Distribution Generator"),
sidebarLayout(
sidebarPanel(
radioButtons("dist", "Distribution type:",
c("Normal" = "norm", "Log-normal" = "lnorm","Exponential" = "exp")),
br(),
sliderInput("n","Number of observations:",
value = 1000, min = 1, max = 2000)
),
mainPanel(
tabsetPanel(type = "tabs",
tabPanel("Plot", plotOutput("plot")),
tabPanel("Summary", verbatimTextOutput("summary")),
tabPanel("Table", tableOutput("table")))))
)