rstudio / ggvis

Interactive grammar of graphics for R
Other
713 stars 171 forks source link

Shiny: 'resizable' disabled with draggable absolutePanel() #434

Open lkuchenb opened 9 years ago

lkuchenb commented 9 years ago

Plots are no longer resizable when a draggable absolutePanel is present. Here is a minimal example:

library(shiny)
library(ggvis)

server <- function(input, output) {

  mtcars %>% 
    ggvis(~wt, ~mpg) %>% 
    layer_points() %>%
    set_options(width = "500", height = "500", resizable=T) %>% 
    bind_shiny("plot")

}

ui <- fluidPage(
  ggvisOutput("plot"),
  absolutePanel(
    draggable = T, style = "opacity: 0.92",
    wellPanel("Hello World")
  )
)

shinyApp(ui, server)
zhongxiali commented 9 years ago

Same thing when you want to select some text inside draggable absolutepanel or have a colorpicker in there. need a way to make certain area of the absolutepanel not draggable