R 当我在ggplot中选择特定坐标时,闪亮的应用程序会崩溃

R 当我在ggplot中选择特定坐标时,闪亮的应用程序会崩溃,r,ggplot2,shiny,R,Ggplot2,Shiny,我有一个闪亮的应用程序,可以在mtcars数据集的选定变量之间创建散点图。如您所见,我修改了数据标签,以便在每个点上显示汽车类型,而不是x-y坐标。问题是,当我点击我的趋势线时,在没有数据的点上——因此显示坐标,应用程序正在崩溃。以下是一个可复制的示例: #ui.r library(shiny) library(ggplot2) library(plotly) library(dplyr) fluidPage( # App title ---- titlePanel(div("CRO

我有一个闪亮的应用程序,可以在
mtcars
数据集的选定变量之间创建散点图。如您所见,我修改了数据标签,以便在每个点上显示汽车类型,而不是x-y坐标。问题是,当我点击我的趋势线时,在没有数据的点上——因此显示坐标,应用程序正在崩溃。以下是一个可复制的示例:

#ui.r
library(shiny)
library(ggplot2)
library(plotly)
library(dplyr)

fluidPage(

  # App title ----
  titlePanel(div("CROSS CORRELATION",style = "color:blue")),

  # Sidebar layout with input and output definitions ----
  sidebarLayout(

    # Sidebar panel for inputs ----
    sidebarPanel(


    ),
    # Main panel for displaying outputs ----
    mainPanel(

      tabsetPanel(type = "tabs",

                  tabPanel("Correlation Plot",

                           fluidRow(
                             column(3, uiOutput("lx1")),
                           column(3,uiOutput("lx2"))),
                           hr(),
                           fluidRow(
                             tags$style(type="text/css",
                                        ".shiny-output-error { visibility: hidden; }",
                                        ".shiny-output-error:before { visibility: hidden; }"
                             )

                           ),
                           fluidRow(
                           plotlyOutput("sc"))
      )

      )
  )))
#server.r
function(input, output) {


  output$lx1<-renderUI({
    selectInput("lx1", label = h4("Select 1st Expression Profile"), 
                choices = colnames(mtcars[,2:5]), 
                selected = "Lex1")
  })
  output$lx2<-renderUI({
    selectInput("lx2", label = h4("Select 2nd Expression Profile"), 
                choices = colnames(mtcars[,2:5]), 
                selected = "Lex2")
  })



  # 1. create reactive values
  vals <- reactiveValues()
  # 2. create df to store clicks
  vals$click_all <- data.frame(x = numeric(),
                               y = numeric(),
                               label = character())
  # 3. add points upon plot click
  observe({
    # get clicked point
    click_data <- event_data("plotly_click", source = "select")
    # get data for current point
    label_data <- data.frame(x = click_data[["x"]],
                             y = click_data[["y"]],
                             label = click_data[["key"]],
                             stringsAsFactors = FALSE)
    # add current point to df of all clicks
    vals$click_all <- merge(vals$click_all,
                            label_data, 
                            all = TRUE)
  }) 

 output$sc<-renderPlotly({
   mtcars$car <- row.names(mtcars)
       p1 <- ggplot(mtcars, aes_string(x = input$lx1, y = input$lx2,key = "car",group="car"))+
         # Change the point options in geom_point
         geom_point(color = "darkblue") +

         # Change the title of the plot (can change axis titles
         # in this option as well and add subtitle)
         labs(title = "Cross Correlation") +
         # Change where the tick marks are
         # Change how the text looks for each element
         theme_bw()+


       geom_smooth(aes(group = 1))+
         # 4. add labels for clicked points
         geom_text(data = vals$click_all,
                   aes(x = x, y = y, label = label),
                   inherit.aes = FALSE, nudge_x = 0.25)

   ggplotly(p1,source = "select", tooltip = c("key")) %>%
     layout(hoverlabel = list(bgcolor = "white", 
                              font = list(family = "Calibri", 
                                          size = 9, 
                                          color = "black")))

 }) 





}
#ui.r
图书馆(闪亮)
图书馆(GG2)
图书馆(绘本)
图书馆(dplyr)
流动摄影(
#应用程序标题----
标题板(div(“互相关”,style=“color:blue”),
#带有输入和输出定义的侧栏布局----
侧边栏布局(
#输入侧栏面板----
侧栏面板(
),
#用于显示输出的主面板----
主面板(
tabsetPanel(type=“tabs”,
tabPanel(“相关图”,
fluidRow(
列(3,uiOutput(“lx1”),
列(3,uiOutput(“lx2”),
hr(),
fluidRow(
标记$style(type=“text/css”,
“.Shining输出错误{可见性:隐藏;}”,
“.Shining输出错误:在{可见性:隐藏;}之前”
)
),
fluidRow(
打印输出(“sc”))
)
)
)))
#服务器.r
功能(输入、输出){

输出$lx1正如您所说,在单击趋势线后,应用程序会出现故障,其中没有与汽车对应的点。让我们继续使用该场景。您会得到以下错误:

警告:data.frame中出错:参数表示行数不同:1,0

此错误的原因是,单击趋势线后,存储在
click\u data
变量中的数据框不包含变量

无论如何,您都可以通过
单击_data[[“key”]]
来访问此变量,但它的输出为
NULL
,因为它不存在

在下一步中,您需要构建一个新的data.frame
label\u data
,其中
label
被分配给
NULL
,从而产生错误

label_data <- data.frame(x = click_data[["x"]],     # it is fine because it is number
                             y = click_data[["y"]], # also fine
                             label = NULL,          # label gets NULL
                             stringsAsFactors = FALSE)

现在我们知道了为什么会出现错误,我们可以找到多种解决方案,其中之一就是首先要求这样做

click_data <- event_data("plotly_click", source = "select")
就是

observe({

        # get clicked point
        click_data <- event_data("plotly_click", source = "select")


        # Require that click_data is available (does not return NULL)
        req(click_data)

        label_ <- ifelse(is.null(click_data[["key"]]),
                         yes = "", 
                         no = click_data[["key"]])

        # get data for current point
        label_data <- data.frame(x = click_data[["x"]],
                                 y = click_data[["y"]],
                                 label = label_,
                                 stringsAsFactors = FALSE)
        # add current point to df of all clicks
        vals$click_all <- merge(vals$click_all,
                                label_data, 
                                all = TRUE)
    }) 
观察({
#点击点

点击数据例外和解释良好的答案。非常感谢!
label_ <- ifelse(is.null(click_data[["key"]]),
                         yes = "", 
                         no = click_data[["key"]])
observe({

        # get clicked point
        click_data <- event_data("plotly_click", source = "select")


        # Require that click_data is available (does not return NULL)
        req(click_data)

        label_ <- ifelse(is.null(click_data[["key"]]),
                         yes = "", 
                         no = click_data[["key"]])

        # get data for current point
        label_data <- data.frame(x = click_data[["x"]],
                                 y = click_data[["y"]],
                                 label = label_,
                                 stringsAsFactors = FALSE)
        # add current point to df of all clicks
        vals$click_all <- merge(vals$click_all,
                                label_data, 
                                all = TRUE)
    }) 
library(shiny)
library(ggplot2)
library(plotly)
library(dplyr)

ui <- fluidPage(

    # App title ----
    titlePanel(div("CROSS CORRELATION",style = "color:blue")),

    # Sidebar layout with input and output definitions ----
    sidebarLayout(

        # Sidebar panel for inputs ----
        sidebarPanel(


        ),
        # Main panel for displaying outputs ----
        mainPanel(

            tabsetPanel(type = "tabs",

                        tabPanel("Correlation Plot",

                                 fluidRow(
                                     column(3, uiOutput("lx1")),
                                     column(3,uiOutput("lx2"))),
                                 hr(),
                                 fluidRow(
                                     tags$style(type="text/css",
                                                ".shiny-output-error { visibility: hidden; }",
                                                ".shiny-output-error:before { visibility: hidden; }"
                                     )

                                 ),
                                 fluidRow(
                                     plotlyOutput("sc"))
                        )

            )
        )))
#server.r
server <- function(input, output) {

    output$lx1<-renderUI({
        selectInput("lx1", label = h4("Select 1st Expression Profile"), 
                    choices = colnames(mtcars[,2:5]), 
                    selected = "Lex1")
    })
    output$lx2<-renderUI({
        selectInput("lx2", label = h4("Select 2nd Expression Profile"), 
                    choices = colnames(mtcars[,2:5]), 
                    selected = "Lex2")
    })



    # 1. create reactive values
    vals <- reactiveValues()
    # 2. create df to store clicks
    vals$click_all <- data.frame(x = numeric(),
                                 y = numeric(),
                                 label = character())
    # 3. add points upon plot click
    observe({

        # get clicked point
        click_data <- event_data("plotly_click", source = "select")


        # Require that click_data is available (does not return NULL)
        req(click_data)

        label_ <- ifelse(is.null(click_data[["key"]]),
                         yes = "", 
                         no = click_data[["key"]])

        # get data for current point
        label_data <- data.frame(x = click_data[["x"]],
                                 y = click_data[["y"]],
                                 label = label_,
                                 stringsAsFactors = FALSE)
        # add current point to df of all clicks
        vals$click_all <- merge(vals$click_all,
                                label_data, 
                                all = TRUE)
    }) 

    output$sc<-renderPlotly({
        mtcars$car <- row.names(mtcars)
        p1 <- ggplot(mtcars, aes_string(x = input$lx1, y = input$lx2,key = "car",group="car"))+
            # Change the point options in geom_point
            geom_point(color = "darkblue") +

            # Change the title of the plot (can change axis titles
            # in this option as well and add subtitle)
            labs(title = "Cross Correlation") +
            # Change where the tick marks are
            # Change how the text looks for each element
            theme_bw()+


            geom_smooth(aes(group = 1))+
            # 4. add labels for clicked points
            geom_text(data = vals$click_all,
                      aes(x = x, y = y, label = label),
                      inherit.aes = FALSE, nudge_x = 0.25)

        ggplotly(p1,source = "select", tooltip = c("key")) %>%
            layout(hoverlabel = list(bgcolor = "white", 
                                     font = list(family = "Calibri", 
                                                 size = 9, 
                                                 color = "black")))

    }) 
}

shinyApp(ui, server)