31 July 2018
library(shiny) library(ggplot2)
dataset <- mtcars
shinyUI(pageWithSidebar(
headerPanel("Mtcars Plotter"),
sidebarPanel(
sliderInput('sampleSize', 'Sample Size', min=10, max=nrow(dataset),
value=min(10, nrow(dataset)), step=5, round=0),
selectInput('x', 'X', names(dataset)),
selectInput('y', 'Y', names(dataset), names(dataset)[[2]]),
selectInput('color', 'Color', c('None', names(dataset))),
# checkboxInput('jitter', 'Jitter'),
checkboxInput('smooth', 'Smooth'),
selectInput('facet_row', 'Facet Row', c(None='.', names(dataset))),
selectInput('facet_col', 'Facet Column', c(None='.', names(dataset)))
),
mainPanel( plotOutput('plot') ) ))
library(shiny) library(ggplot2)
shinyServer(function(input, output) {
dataset <- reactive( { mtcars[sample(nrow(mtcars), input$sampleSize),] })
output$plot <- reactivePlot(function() {
p <- ggplot(dataset(), aes_string(x=input$x, y=input$y)) + geom_point() if (input$color != 'None') p <- p + aes_string(color=input$color) facets <- paste(input$facet_row, '~', input$facet_col) if (facets != '. ~ .') p <- p + facet_grid(facets) if (input$smooth) p <- p + geom_smooth() print(p)
}, height=600 )
})
Code on Github https://github.com/Sergecage/DEveloping-data-products-final-project
Check my app: https://sergeik.shinyapps.io/RStudioproject/