如何通过再次单击该功能删除使用Shiny和mapedit进行的选择?

时间:2018-06-14 00:21:13

标签: r shiny r-leaflet

使用Shiny,leaflet和mapedit包我可以使用下面的代码生成包含多个系列的图表。

直观地,我想第二次点击选定的地图图标,并从图表中删除相关数据。基本上,点击事件可以打开或关闭。

有人有任何建议吗?

# devtools::install_github("r-spatial/sf")
# devtools::install_github("r-spatial/mapview@develop")
# devtools::install_github("bhaskarvk/leaflet.extras")
# devtools::install_github("r-spatial/mapedit")
library(tidyverse)
library(sf)
library(leaflet)
library(mapedit)
library(mapview)
library(shiny)
library(shinyjs)

locnCoord <-
  data.frame(location = c('Sit1','Site2','Site3'),
             lat=c(-18.1, -18.3, -18.4),
             lon=c(145.8, 145.9, 145.9)) %>%
  mutate(depth = runif(3))

locnSF <- st_as_sf(locnCoord, coords = c('lon','lat'), crs="+proj=longlat +datum=WGS84 +no_defs")

#### User input

ui <- fluidPage(
  shinyjs::useShinyjs(),
  shinyjs::extendShinyjs(text = "shinyjs.refresh = function() { location.reload(); }"),
  fluidRow(
    # edit module ui
    column(6,
           selectModUI("selectmap"),
           actionButton("refresh", "Refresh Map")
           ),
    column(6,
           h3("Point of Depth"),
           plotOutput("selectstat")
           )
    )
  )

#### Server

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

  observeEvent(input$refresh, {
    shinyjs::js$refresh()
  })

  g_sel <- callModule(
    selectMod,
    "selectmap",
    leaflet() %>%
      addTiles() %>%
      addFeatures(
        data = locnSF,
        layerId = ~location,
        stroke = TRUE,
        color = 'orange',
        fill = TRUE,
        fillColor = 'black',
        radius=10)
  )

  rv <- reactiveValues(selected=NULL)

  observe({
    gs <- g_sel()

    if(length(gs$id) > 0) {
      rv$selected <- locnSF %>% filter(location %in% gs$id)
    } else {
      rv$selected <- NULL
    }
  })

  output$selectstat <- renderPlot({
    ggplot()
    if(!is.null(rv$selected) && nrow(rv$selected) > 0) {
      ggplot(data=rv$selected, aes(location, depth))+
        geom_point(color='red', size=5)
    } else {
      ggplot()
    }
  })
}
shinyApp(ui, server)

1 个答案:

答案 0 :(得分:1)

这很有效。在您的服务器中试试这个:

observe({
   gs <- g_sel()

   if(length(gs$id) > 0) {
     site_select <- c(gs$selected)
     rv$selected <- locnSF %>% filter(location %in% gs$id) %>% 
       mutate(keeps = site_select) %>% filter(keeps == "TRUE")
   } else {
     rv$selected <- NULL
   }
})

这是根据您上面的代码编辑的。我所做的是添加一个名为keep mutate的新列,其中包含选择该站点的逻辑术语,然后仅筛选TRUE(即当前选定的)观察值。当您取消选择某个站点时,术语in保持变为FALSE,因此从rv $ selected中省略。

希望这有帮助。