shiny icon indicating copy to clipboard operation
shiny copied to clipboard

Version 1.9.1: ggvis plots are greyed out

Open richarddirocco opened this issue 1 year ago • 2 comments

System details

Browser Version: N/A

Output of sessionInfo():

R version 4.4.0 (2024-04-24 ucrt)
Platform: x86_64-w64-mingw32/x64
Running under: Windows 10 x64 (build 19045)

Matrix products: default


locale:
[1] LC_COLLATE=English_Canada.utf8  LC_CTYPE=English_Canada.utf8    LC_MONETARY=English_Canada.utf8 LC_NUMERIC=C                   
[5] LC_TIME=English_Canada.utf8    

time zone: America/Chicago
tzcode source: internal

attached base packages:
[1] stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] tidyr_1.3.1       ggvis_0.4.9       shinythemes_1.2.0 shiny_1.9.1      

loaded via a namespace (and not attached):
 [1] vctrs_0.6.5       cli_3.6.3         rlang_1.1.4       purrr_1.0.2       promises_1.3.0    generics_0.1.3    assertthat_0.2.1 
 [8] jsonlite_1.8.8    xtable_1.8-4      glue_1.7.0        htmltools_0.5.8.1 httpuv_1.6.15     sass_0.4.9        fansi_1.0.6      
[15] jquerylib_0.1.4   tibble_3.2.1      fastmap_1.2.0     lifecycle_1.0.4   memoise_2.0.1     compiler_4.4.0    dplyr_1.1.4      
[22] Rcpp_1.0.13       pkgconfig_2.0.3   rstudioapi_0.16.0 later_1.3.2       digest_0.6.36     R6_2.5.1          tidyselect_1.2.1 
[29] utf8_1.2.4        pillar_1.9.0      magrittr_2.0.3    bslib_0.8.0       tools_4.4.0       withr_3.0.1       mime_0.12        
[36] cachem_1.1.0     

Example application or steps to reproduce the problem

library(shiny)
library(ggvis)

ui <- fluidPage(
  sidebarPanel(
    sliderInput("size", "Area", 10, 1000, value = 10)
  ),
  mainPanel(
    uiOutput("ggvis_ui"),
    ggvisOutput("ggvis")
  )
)

server <- function(input, output) {
  input_size <- reactive(input$size)
  
  mtcars %>% 
    ggvis(~disp, ~mpg, size := input_size) %>%
    layer_points() %>%
    bind_shiny("ggvis", "ggvis_ui")
}

shinyApp(ui = ui, server = server)

Describe the problem in detail

Hello,

My ggvis plot isn't displaying properly using Shiny version 1.9.1. It appears greyed out. When I reverted to version 1.8.1, the plot displays correctly. I realize ggvis is dormant and hasn't been updated in a long time but I still use it for some tools I created years ago.

Greyed out plot using Shiny 1.9.1: Shiny_1 9 0 Greyed Out ggvis

Correctly displayed plot using Shiny version 1.8.1: Shiny_1 8 1 correct ggvis

Thank you

richarddirocco avatar Aug 12 '24 21:08 richarddirocco

Thanks for the report @richarddirocco. There were some changes in 1.9 that improved our consistency with how we report output state. It seems, however, that ggvis gets stuck in a recalculating state. @cpsievert might have some insight about the bug.

As an interim solution, you could disable the fading during recalculation for ggvis outputs with this CSS rule:

.ggvis-output.recalculating {
  --shiny-fade-opacity: 1;
}

gadenbuie avatar Sep 04 '24 14:09 gadenbuie

I'm also getting this issue with mapdeck, and setting

.mapdeckmap.recalculating {
  --shiny-fade-opacity: 1;
}

is working as an interim solution

dcooley avatar Oct 03 '24 00:10 dcooley