R传单和闪亮如何清除地图点击数据 [英] R leaflet and shiny How to clear map click data

查看:23
本文介绍了R传单和闪亮如何清除地图点击数据的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

以下示例取自 RStudio 教程 on leaflet.我稍微修改了一下以适应我的问题.

The example below is taken from the RStudio tutorial on leaflet. I modified it slightly to fit my issue.

我有一张地图(这里是地震),我使用 addCircleMarkers 在地图上绘制它,单击时会出现一个包含一些信息的弹出窗口.我想在我的真实应用程序中做的是,当在地图上单击标记时,它将页面上的其他图形过滤为仅与该标记相关的数据.我知道如何使用 input$map_marker_click 获取有关用户单击位置的信息 - 这将为我提供足以满足我需求的纬度和经度.但是 - 一旦设置,这个值就不会改变.当用户在非标记区域单击地图时,它不会恢复为 NULL.如何检测用户在地图中点击了标记以外的其他内容并将 input$map_marker_click 重置为 NULL

I have a map (here, earthquakes) which I draw on the map using addCircleMarkers and when clicked, the a popup appears with some information. What I want to do in my real app is make it so when a marker is clicked on the map, it filters the other graphs on the page to only the data relevant to that marker. I know how to get the info about where a user has clicked using input$map_marker_click - this will give me the latitude and longitude which will be sufficient for my needs. However - once set, this value doesn't change. It doesn't revert to NULL when the user clicks on the map in a non-marker area. How do I detect a user has clicked in the map on something other than a marker and reset input$map_marker_click to NULL

下面的示例没有其他图表,但我确实有它显示 input$map_marker_click

The example below doesn't have other graphs but I do have it displaying the value of input$map_marker_click

library(shiny)
library(leaflet)
library(RColorBrewer)

ui <- bootstrapPage(
  tags$style(type = "text/css", "html, body {width:100%;height:100%}"),
  leafletOutput("map", width = "100%", height = "100%"),
  absolutePanel(top = 10, right = 10,
                sliderInput("range", "Magnitudes", min(quakes$mag), max(quakes$mag),
                            value = range(quakes$mag), step = 0.1
                ),
                selectInput("colors", "Color Scheme",
                            rownames(subset(brewer.pal.info, category %in% c("seq", "div")))
                ),
                checkboxInput("legend", "Show legend", TRUE),
                verbatimTextOutput("clickInfo")
  )
)

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

  output$clickInfo = renderPrint({input$map_marker_click})

  filteredData <- reactive({
    quakes[quakes$mag >= input$range[1] & quakes$mag <= input$range[2],]
  })

  colorpal <- reactive({
    colorNumeric(input$colors, quakes$mag)
  })

  output$map <- renderLeaflet({
    leaflet(quakes) %>% addTiles() %>%
      fitBounds(~min(long), ~min(lat), ~max(long), ~max(lat))
  })

  observe({
    pal <- colorpal()
    leafletProxy("map", data = filteredData()) %>%
      clearShapes() %>%
      addCircleMarkers(radius = ~mag^2/3, weight = 1, color = "#777777",
                 fillColor = ~pal(mag), fillOpacity = 0.7, popup = ~paste(mag)
      )
  })

  observe({
    proxy <- leafletProxy("map", data = quakes)
    proxy %>% clearControls()
    if (input$legend) {
      pal <- colorpal()
      proxy %>% addLegend(position = "bottomright",
                          pal = pal, values = ~mag
      )
    }
  })
}

shinyApp(ui, server)

推荐答案

我问了同样的问题 here,用户 NiceE 提供了一个解决方案.

I asked this same question here and user NicE provided a solution there.

如果有人遇到此页面寻找解决方案,下面的代码实现了上述请求,当在标记后单击地图时,将单击值重置为 NULL.示例中唯一的附加代码位于两行 #s 之间.

In case anyone comes across this page looking for a solution, the below code achieves the above request resetting the click value to NULL when the map is clicked after a marker. The only additional code from the example is between the two lines of #s.

library(shiny)
library(leaflet)
library(RColorBrewer)

ui <- bootstrapPage(
  tags$style(type = "text/css", "html, body {width:100%;height:100%}"),
  leafletOutput("map", width = "100%", height = "100%"),
  absolutePanel(top = 10, right = 10,
                sliderInput("range", "Magnitudes", min(quakes$mag), max(quakes$mag),
                            value = range(quakes$mag), step = 0.1
                ),
                selectInput("colors", "Color Scheme",
                            rownames(subset(brewer.pal.info, category %in% c("seq", "div")))
                ),
                checkboxInput("legend", "Show legend", TRUE),
                verbatimTextOutput("clickInfo")
  )
)

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

  #########################################################

  data <- reactiveValues(clickedMarker=NULL)

  observeEvent(input$map_marker_click,
               {data$clickedMarker <- input$map_marker_click})

  observeEvent(input$map_click,
               {data$clickedMarker <- NULL})

  output$clickInfo <- renderPrint({data$clickedMarker})

  ##########################################################

  filteredData <- reactive({
    quakes[quakes$mag >= input$range[1] & quakes$mag <= input$range[2],]
  })

  colorpal <- reactive({
    colorNumeric(input$colors, quakes$mag)
  })

  output$map <- renderLeaflet({
    leaflet(quakes) %>% addTiles() %>%
      fitBounds(~min(long), ~min(lat), ~max(long), ~max(lat))
  })

  observe({
    pal <- colorpal()
    leafletProxy("map", data = filteredData()) %>%
      clearShapes() %>%
      addCircleMarkers(radius = ~mag^2/3, weight = 1, color = "#777777",
                       fillColor = ~pal(mag), fillOpacity = 0.7, popup = ~paste(mag)
      )
  })

  observe({
    proxy <- leafletProxy("map", data = quakes)
    proxy %>% clearControls()
    if (input$legend) {
      pal <- colorpal()
      proxy %>% addLegend(position = "bottomright",
                          pal = pal, values = ~mag
      )
    }
  })
}

shinyApp(ui, server)

这篇关于R传单和闪亮如何清除地图点击数据的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

查看全文
登录 关闭
扫码关注1秒登录
发送“验证码”获取 | 15天全站免登陆