R/ui_source.R

Defines functions myUI

myUI <- function(){
  shinyUI (
    navbarPage("BlueBox App",
               selected = "Dashboard",
               fluid = TRUE,
               theme = shinytheme("darkly"),
               includeCSS("inst/app/www/css/navbar.css"),
               tabPanel("Dashboard",
                        sidebarLayout(
                          sidebarPanel(
                            radioButtons("plotType", "Plot type",
                                         c("Scatter"="p", "Line"="l")
                            )
                          ),
                          mainPanel(
                            plotOutput("plot")
                          )
                        )
               ),
               tabPanel("Summary",
                        verbatimTextOutput("summary")
               ),
               navbarMenu("More",
                          tabPanel("Table",
                                   DT::dataTableOutput("table")
                          ),
                          tabPanel("About",
                                   fluidRow(
                                     column(6,
                                            #includeMarkdown("about.md")
                                     ),
                                     column(3,
                                            img(class="img-polaroid",
                                                src=paste0("http://upload.wikimedia.org/",
                                                           "wikipedia/commons/9/92/",
                                                           "1919_Ford_Model_T_Highboy_Coupe.jpg")),
                                            tags$small(
                                              "Source: Photographed at the Bay State Antique ",
                                              "Automobile Club's July 10, 2005 show at the ",
                                              "Endicott Estate in Dedham, MA by ",
                                              a(href="http://commons.wikimedia.org/wiki/User:Sfoskett",
                                                "User:Sfoskett")
                                            )
                                     )
                                   )
                          )
               )
    )
  )
}
jonasfor/bluebox documentation built on Dec. 21, 2021, 2:16 a.m.