Hi
I try to change the histogram x axis from the choice done in my select input but I dont succeed
Could you help please?
library(shiny)
# Define UI for application that draws a histogram
ui <- fluidPage(
# Application title
titlePanel("Histogramme dynamique"),
sidebarPanel(
selectInput('x', 'Liste déroulante', vars),
),
# Show a plot of the generated distribution
mainPanel(
plotOutput("distPlot")
)
)
# Define server logic required to draw a histogram
server <- function(input, output, session) {
output$distPlot <- renderPlot({input$x
# draw the histogram with the specified number of bins
hist(x, col='blue', axes = TRUE, plot = TRUE)
})
}
shinyApp(ui, server)