You signed in with another tab or window. Reload to refresh your session.You signed out in another tab or window. Reload to refresh your session.You switched accounts on another tab or window. Reload to refresh your session.Dismiss alert
With the changes from rstudio/shiny#3116, a new input node private$currentThemeDependency is introduced which is expected as mentioned by @wch in rstudio/shiny#3160.
However, this node is displayed at the output section instead of at the input section
Steps to reproduce:
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$waitingbins<- 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)
Notice that as highlighted in the snapshot below, private$currentThemeDependency despite being input value, its shown at the output section
The text was updated successfully, but these errors were encountered:
With the changes from rstudio/shiny#3116, a new input node
private$currentThemeDependency
is introduced which is expected as mentioned by @wch in rstudio/shiny#3160.However, this node is displayed at the output section instead of at the input section
Steps to reproduce:
private$currentThemeDependency
despite being input value, its shown at the output sectionThe text was updated successfully, but these errors were encountered: