inst/shiny/RV_distributionsV4/ui.R

library(shiny)
library(shinythemes)
library(snaputils)
addResourcePath("res", snap_res("images"))

shinyUI(fluidPage(theme=shinytheme("united"),
	headerPanel(
		HTML('Distributions of Random Variables v4
			<a href="http://snap.uaf.edu" target="_blank"><img align="right" src="res/snap_acronym_color.svg" height="35px"/></a>'
		), "Distributions of Random Variables"
	),
	fluidRow(
		column(4,
			wellPanel( radioButtons("disttype","Distribution type:",list("Discrete","Continuous"),selected="Discrete") ),
			wellPanel(	uiOutput("distName") ),
			wellPanel(
				numericInput("n","Sample size:",10000),
				uiOutput("dist1"),
				uiOutput("dist2"),
				uiOutput("dist3")
			),
			wellPanel(
				uiOutput("sampDens"),
				uiOutput("BW"),
				fluidRow(
					column(6, downloadButton("dlCurPlot", "Download Graphic", class="btn-block btn-primary")),
					column(6, downloadButton("dldat", "Download Sample", class="btn-block btn-warning"))
				)
			)
		),
		column(8,
			tabsetPanel(
				tabPanel("Plot",plotOutput("plot", width="100%", height="auto")),
				tabPanel("Summary",verbatimTextOutput("summary")),
				tabPanel("Table",tableOutput("table")),
				id="tsp"
			)
		)
	)
))
leonawicz/snapapps documentation built on May 6, 2019, 2:32 p.m.