inst/shiny/dataCat/ui.R

library(shiny)

# Define UI for miles per gallon application
shinyUI(pageWithSidebar(
  
  # Application title
  headerPanel("Ctesiphon catenary"),
  
  
  sidebarPanel(
    h4("Left endpoint"),
    selectInput("internal","Select observations",
                c("Internal"="int",
                  "External"='ext'))),

  
  mainPanel(
    plotOutput("catPlot"),
    verbatimTextOutput("summary")
  )
))

Try the catenary package in your browser

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

catenary documentation built on May 2, 2019, 10:51 a.m.