library(shiny)
library(thematic)
theme_base <- thematic_theme("black", "white", accent = "purple")
theme_ggplot <- thematic_theme("black", "white", accent = "red")
theme_lattice <- thematic_theme("black", "white", accent = "orange")
ui <- fluidPage(
plotOutput("base"),
plotOutput("ggplot"),
plotOutput("lattice")
)
server <- function(input, output, session) {
output$base <- renderPlot({
thematic_local_theme(theme_base)
plot(1:10, 1:10, col = thematic_get_option("accent"))
})
output$ggplot <- renderPlot({
thematic_local_theme(theme_ggplot)
print(ggplot2::qplot(1:10, 1:10, color = 1:10))
})
output$lattice <- renderPlot({
thematic_local_theme(theme_lattice)
print(lattice::show.settings())
})
}
shinyApp(ui, server)
Add the following code to your website.
For more information on customizing the embed code, read Embedding Snippets.