How to debug ggplot in browser mode wihtin shiny ?

We used to check the reactive value using browser but
when ggplot is not rendering expected graph, how can we debug this in reactive mode ?

library(shiny)

ui <- basicPage(
  plotOutput("plot1", click = "plot_click"),
  verbatimTextOutput("info")
)

server <- function(input, output) {
  output$plot1 <- renderPlot({
    browser() # Here, the browser stops but when run the below line, cannot see the plot in plots tab
    plot(mtcars$wt, mtcars$mpg)
  })
  
  output$info <- renderText({
    paste0("x=", input$plot_click$x, "\ny=", input$plot_click$y)
  })
}

shinyApp(ui, server)

@thothal answered.

This topic was automatically closed 7 days after the last reply. New replies are no longer allowed.