rstudio / reactlog

Shiny Reactivity Visualizer
http://rstudio.github.io/reactlog
Other
123 stars 9 forks source link

Reactive input private$currentThemeDependency is shown at the output #75

Open MadhulikaTanuboddi opened 3 years ago

MadhulikaTanuboddi commented 3 years ago

With the changes from https://github.com/rstudio/shiny/pull/3116, a new input node private$currentThemeDependency is introduced which is expected as mentioned by @wch in https://github.com/rstudio/shiny/pull/3160.

However, this node is displayed at the output section instead of at the input section

Steps to reproduce:

  1. Run the following example
library(shiny)
# Enable reactlog
library(reactlog)
reactlog_enable()

ui <- fluidPage(
  titlePanel("Hello Shiny!"),
  sidebarLayout(
    sidebarPanel(
      sliderInput(inputId = "bins",
                  label = "Number of bins:",
                  min = 1,
                  max = 50,
                  value = 30)

    ),
    mainPanel(
      plotOutput(outputId = "distPlot")
    )
  ),
  ### start ui module
  reactlog_module_ui()
  ### end ui module
)

server <- function(input, output, session) {
  x <- faithful$waiting
  bins <- reactive({
    seq(min(x), max(x), length.out = input$bins + 1)
  })
  output$distPlot <- renderPlot({

    hist(x, breaks = bins(), col = "#75AADB", border = "white",
         xlab = "Waiting time to next eruption (in mins)",
         main = "Histogram of waiting times")

  })

  ### start server module
  reactlog_module_server()
  ### end server module
}

shinyApp(ui = ui, server = server)
  1. Notice that as highlighted in the snapshot below, private$currentThemeDependency despite being input value, its shown at the output section

shiny_private_current_theme-dependency_displayed at output