R闪亮的情节宽度和高度不更新

时间:2017-11-26 21:19:24

标签: r shiny plotly

我正在编写一个闪亮的应用程序,我尝试根据某些输入更新绘图的大小。问题是,当情节变大时,它不会回到较小的尺寸。

initialize This one doesn't come back to smaller sizes

这是代码:

library(dplyr)
library(plotly)
library(shiny)

dat <- data.frame(xval = sample(100,1000,replace = TRUE),
                  group1 = as.factor(sample(c("a","b","c"),1000,replace = TRUE)),
                  group2 = as.factor(sample(c("a1","a2","a3","a4"),1000, replace = TRUE)),
                  group3 = as.factor(sample(c("b1","b2","b3","b4"),1000, replace = TRUE)),
                  group4 = as.factor(sample(c("c1","c2","c3","c4"),1000, replace = TRUE)))


create_plot <- function(dat, group, color, shape) {
    p <- dat %>%
      plot_ly() %>%
      add_trace(x = ~as.numeric(get(group)), 
                y = ~xval, 
                color = ~get(group),
                type = "box") %>%
      add_markers(x = ~jitter(as.numeric(get(group))), 
                  y = ~xval, 
                  color = ~get(color),
                  symbol = ~get(shape),
                  marker = list(size = 4)
      )
  p
}

calc_boxplot_size <- function(facet) {

  if (facet) {
    width <- 1000
    height <- 700
  } else {
    width <- 500
    height <- 400
  }
  cat(sprintf("WIDTH: %s, HEIGHT: %s", width, height), sep = "\n")
  list(width = width, height = height)
}



ui <- fluidPage(
  selectizeInput("group", label = "group", choices = paste0("group", 1:4),
                 multiple = FALSE),
  selectizeInput("color", label = "color", choices = paste0("group", 1:4),
                 multiple = FALSE),
  selectizeInput("shape", label = "shape", choices = paste0("group", 1:4),
                 multiple = FALSE),
  selectizeInput("facet", label = "facet", choices = c("none", paste0("group", 1:4)),
                 multiple = FALSE, selected = "none"),
  textOutput("size"),
  uiOutput("plotbox")
)

server <- function(input, output, session) {

  output$plotbox <- renderUI({
    psize <- calc_boxplot_size((input$facet != "none"))
    plotlyOutput("plot", height = psize$height, width = psize$width)
  })

  output$size <- renderText({
    psize <- calc_boxplot_size((input$facet != "none"))
    sprintf("WIDTH: %s, HEIGHT: %s", psize$width, psize$height)
  })

  output$plot <- renderPlotly({
    if (input$facet == "none") {
      p <- create_plot(dat, input$group, input$color, input$shape)
    } else {
      plots <- dat %>%
        group_by_(.dots = input$facet) %>%
        do(p = {
          create_plot(., input$group, input$color, input$shape)
        })
      p <- subplot(plots, shareX = TRUE, shareY = TRUE, nrows = 3, margin = 0.02)
    }
  })

}

shinyApp(ui, server)

如果我更改代码以在... %>% plotly(height = height, width = width) %>% ...中更新宽度和高度,则它永远不会更新绘图的大小。

Should be bigger

代码:

library(dplyr)
library(plotly)
library(shiny)

dat <- data.frame(xval = sample(100,1000,replace = TRUE),
                  group1 = as.factor(sample(c("a","b","c"),1000,replace = TRUE)),
                  group2 = as.factor(sample(c("a1","a2","a3","a4"),1000, replace = TRUE)),
                  group3 = as.factor(sample(c("b1","b2","b3","b4"),1000, replace = TRUE)),
                  group4 = as.factor(sample(c("c1","c2","c3","c4"),1000, replace = TRUE)))


create_plot <- function(dat, group, color, shape, width, height) {
    p <- dat %>%
      plot_ly(width = width, height = height) %>%
      add_trace(x = ~as.numeric(get(group)), 
                y = ~xval, 
                color = ~get(group),
                type = "box") %>%
      add_markers(x = ~jitter(as.numeric(get(group))), 
                  y = ~xval, 
                  color = ~get(color),
                  symbol = ~get(shape),
                  marker = list(size = 4)
      )
  p
}

calc_boxplot_size <- function(facet) {

  if (facet) {
    width <- 1000
    height <- 700
  } else {
    width <- 500
    height <- 400
  }
  cat(sprintf("WIDTH: %s, HEIGHT: %s", width, height), sep = "\n")
  list(width = width, height = height)
}



ui <- fluidPage(
  selectizeInput("group", label = "group", choices = paste0("group", 1:4),
                 multiple = FALSE),
  selectizeInput("color", label = "color", choices = paste0("group", 1:4),
                 multiple = FALSE),
  selectizeInput("shape", label = "shape", choices = paste0("group", 1:4),
                 multiple = FALSE),
  selectizeInput("facet", label = "facet", choices = c("none", paste0("group", 1:4)),
                 multiple = FALSE, selected = "none"),
  textOutput("size"),
  uiOutput("plotbox")
)

server <- function(input, output, session) {

  output$plotbox <- renderUI({
    psize <- calc_boxplot_size((input$facet != "none"))
    plotlyOutput("plot")
  })

  output$size <- renderText({
    psize <- calc_boxplot_size((input$facet != "none"))
    sprintf("WIDTH: %s, HEIGHT: %s", psize$width, psize$height)
  })

  output$plot <- renderPlotly({
    psize <- calc_boxplot_size((input$facet != "none"))
    if (input$facet == "none") {
      p <- create_plot(dat, input$group, input$color, input$shape, psize$width, psize$height)
    } else {
      plots <- dat %>%
        group_by_(.dots = input$facet) %>%
        do(p = {
          create_plot(., input$group, input$color, input$shape, psize$width, psize$height)
        })
      p <- subplot(plots, shareX = TRUE, shareY = TRUE, nrows = 3, margin = 0.02)
    }
  })

}

shinyApp(ui, server)

有没有其他方法来更新这样的情节大小?请帮忙。

1 个答案:

答案 0 :(得分:1)

我添加了自定义宽度和高度输入,它可以工作......或者我可能只是没有得到问题......

enter image description here enter image description here

<BrowserRouter basename="/your/app">
  <App/>
</BrowserRouter>