Title: | Themes for Shiny |
---|---|
Description: | Themes for use with Shiny. Includes several Bootstrap themes from <https://bootswatch.com/>, which are packaged for use with Shiny applications. |
Authors: | Winston Chang [aut, cre], RStudio [cph], Thomas Park [ctb, cph] (Bootswatch themes), Lukasz Dziedzic [ctb, cph] (Lato font), Nathan Willis [ctb, cph] (News Cycle font), Google Corporation [ctb, cph] (Open Sans and Roboto fonts), Matt McInerney [ctb, cph] (Raleway font), Adobe Systems Incorporated [ctb, cph] (Source Sans Pro font), Canonical Ltd [ctb, cph] (Ubuntu font) |
Maintainer: | Winston Chang <[email protected]> |
License: | GPL-3 | file LICENSE |
Version: | 1.2.0 |
Built: | 2024-11-21 03:34:12 UTC |
Source: | https://github.com/rstudio/shinythemes |
The result of this function should be used as the theme
argument for
bootstrapPage
, fluidPage
,
navbarPage
, or fixedPage
.
shinytheme(theme = NULL)
shinytheme(theme = NULL)
theme |
Name of a theme. |
The main shinythemes page for information about available themes and more detailed examples.
## Not run: shinyApp( ui = fluidPage(theme = shinytheme("united"), ... ), server = function(input, output) { } ) ## End(Not run)
## Not run: shinyApp( ui = fluidPage(theme = shinytheme("united"), ... ), server = function(input, output) { } ) ## End(Not run)
This package contains Bootstrap themes from https://bootswatch.com/, which are packaged for use with Shiny applications. The themes included are:
To use the themes, use the theme
argument to
bootstrapPage
, fluidPage
,
navbarPage
, or fixedPage
. The value
should be shinytheme("cerulean")
, where the theme name takes the place
of "cerulean"
.
## Not run: library(shiny) library(shinythemes) # A very basic navbar page with different themes shinyApp( ui = navbarPage("Default theme", tabPanel("Plot", "Plot tab contents..."), navbarMenu("More", tabPanel("Summary", "Summary tab contents..."), tabPanel("Table", "Table tab contents...") ) ), server = function(input, output) { } ) shinyApp( ui = navbarPage("United", theme = shinytheme("united"), tabPanel("Plot", "Plot tab contents..."), navbarMenu("More", tabPanel("Summary", "Summary tab contents..."), tabPanel("Table", "Table tab contents...") ) ), server = function(input, output) { } ) shinyApp( ui = navbarPage("Cerulean", theme = shinytheme("cerulean"), tabPanel("Plot", "Plot tab contents..."), navbarMenu("More", tabPanel("Summary", "Summary tab contents..."), tabPanel("Table", "Table tab contents...") ) ), server = function(input, output) { } ) # A more complicated app with the flatly theme shinyApp( ui = fluidPage( theme = shinytheme("flatly"), titlePanel("Tabsets"), sidebarLayout( sidebarPanel( radioButtons("dist", "Distribution type:", c("Normal" = "norm", "Uniform" = "unif", "Log-normal" = "lnorm", "Exponential" = "exp")), br(), sliderInput("n", "Number of observations:", value = 500, min = 1, max = 1000) ), mainPanel( tabsetPanel(type = "tabs", tabPanel("Plot", plotOutput("plot")), tabPanel("Summary", verbatimTextOutput("summary")), tabPanel("Table", tableOutput("table")) ) ) ) ), server = function(input, output) { data <- reactive({ dist <- switch(input$dist, norm = rnorm, unif = runif, lnorm = rlnorm, exp = rexp, rnorm) dist(input$n) }) output$plot <- renderPlot({ dist <- input$dist n <- input$n hist(data(), main=paste('r', dist, '(', n, ')', sep='')) }) output$summary <- renderPrint({ summary(data()) }) output$table <- renderTable({ data.frame(x=data()) }) } ) ## End(Not run)
## Not run: library(shiny) library(shinythemes) # A very basic navbar page with different themes shinyApp( ui = navbarPage("Default theme", tabPanel("Plot", "Plot tab contents..."), navbarMenu("More", tabPanel("Summary", "Summary tab contents..."), tabPanel("Table", "Table tab contents...") ) ), server = function(input, output) { } ) shinyApp( ui = navbarPage("United", theme = shinytheme("united"), tabPanel("Plot", "Plot tab contents..."), navbarMenu("More", tabPanel("Summary", "Summary tab contents..."), tabPanel("Table", "Table tab contents...") ) ), server = function(input, output) { } ) shinyApp( ui = navbarPage("Cerulean", theme = shinytheme("cerulean"), tabPanel("Plot", "Plot tab contents..."), navbarMenu("More", tabPanel("Summary", "Summary tab contents..."), tabPanel("Table", "Table tab contents...") ) ), server = function(input, output) { } ) # A more complicated app with the flatly theme shinyApp( ui = fluidPage( theme = shinytheme("flatly"), titlePanel("Tabsets"), sidebarLayout( sidebarPanel( radioButtons("dist", "Distribution type:", c("Normal" = "norm", "Uniform" = "unif", "Log-normal" = "lnorm", "Exponential" = "exp")), br(), sliderInput("n", "Number of observations:", value = 500, min = 1, max = 1000) ), mainPanel( tabsetPanel(type = "tabs", tabPanel("Plot", plotOutput("plot")), tabPanel("Summary", verbatimTextOutput("summary")), tabPanel("Table", tableOutput("table")) ) ) ) ), server = function(input, output) { data <- reactive({ dist <- switch(input$dist, norm = rnorm, unif = runif, lnorm = rlnorm, exp = rexp, rnorm) dist(input$n) }) output$plot <- renderPlot({ dist <- input$dist n <- input$n hist(data(), main=paste('r', dist, '(', n, ')', sep='')) }) output$summary <- renderPrint({ summary(data()) }) output$table <- renderTable({ data.frame(x=data()) }) } ) ## End(Not run)
This adds a widget for selecting the theme, in a floating panel. It is meant for use during the development phase of a Shiny application.
themeSelector()
themeSelector()
This can be inserted anywhere inside of the application, although if it is put inside a tab, it will be visible only when that tab is showing. For it to show at all times, it must be used outside a tab.
if (interactive()) { # themeSelector can be inserted anywhere in the app. shinyApp( ui = fluidPage( shinythemes::themeSelector(), sidebarPanel( textInput("txt", "Text input:", "text here"), sliderInput("slider", "Slider input:", 1, 100, 30), actionButton("action", "Button"), actionButton("action2", "Button2", class = "btn-primary") ), mainPanel( tabsetPanel( tabPanel("Tab 1"), tabPanel("Tab 2") ) ) ), server = function(input, output) {} ) # If this is used with a navbarPage() or other type of page where there is not a # good place to put it where it is outside of all tabs, you can wrap the entire # page in tagList() and make the themeSelector a sibling of the page. shinyApp( ui = tagList( shinythemes::themeSelector(), navbarPage( "Theme test", tabPanel("Navbar 1", sidebarPanel( textInput("txt", "Text input:", "text here"), sliderInput("slider", "Slider input:", 1, 100, 30), actionButton("action", "Button"), actionButton("action2", "Button2", class = "btn-primary") ), mainPanel( tabsetPanel( tabPanel("Tab 1"), tabPanel("Tab 2") ) ) ), tabPanel("Navbar 2") ) ), server = function(input, output) {} ) }
if (interactive()) { # themeSelector can be inserted anywhere in the app. shinyApp( ui = fluidPage( shinythemes::themeSelector(), sidebarPanel( textInput("txt", "Text input:", "text here"), sliderInput("slider", "Slider input:", 1, 100, 30), actionButton("action", "Button"), actionButton("action2", "Button2", class = "btn-primary") ), mainPanel( tabsetPanel( tabPanel("Tab 1"), tabPanel("Tab 2") ) ) ), server = function(input, output) {} ) # If this is used with a navbarPage() or other type of page where there is not a # good place to put it where it is outside of all tabs, you can wrap the entire # page in tagList() and make the themeSelector a sibling of the page. shinyApp( ui = tagList( shinythemes::themeSelector(), navbarPage( "Theme test", tabPanel("Navbar 1", sidebarPanel( textInput("txt", "Text input:", "text here"), sliderInput("slider", "Slider input:", 1, 100, 30), actionButton("action", "Button"), actionButton("action2", "Button2", class = "btn-primary") ), mainPanel( tabsetPanel( tabPanel("Tab 1"), tabPanel("Tab 2") ) ) ), tabPanel("Navbar 2") ) ), server = function(input, output) {} ) }