gpt4 book ai didi

r - 在传单 Shiny 中拖动标记后如何更新坐标?

转载 作者:行者123 更新时间:2023-12-01 18:02:01 26 4
gpt4 key购买 nike

我想要一个应用程序,它可以在点击时生成新点,类似于这里: R leaflet how to click on map and add a circle

但是标记应该是可拖动的,并且当拖动时,坐标应该更新,如数据表中所示。我通过鼠标悬停事件实现了这一点。我找到了这个解决方案,但是如果我设置两个点,两个点将具有相同的坐标(从第二个点开始),并且只有在触发鼠标悬停时才会刷新。

library(shiny)
library(leaflet)

df <- data.frame(longitude = 10.5, latitude = 48)

ui <- fluidPage(
navbarPage("Title",
tabPanel("Map",
mainPanel(leafletOutput("map", width = "100%", height = "700")
)),
tabPanel("Data", dataTableOutput("table"))
)
)

server <- function(input, output) {

output$map <- renderLeaflet({
leaflet() %>% addTiles()
})

df_r <- reactiveValues(new_data = df)

# reactive list with id of added markers
clicked_markers <- reactiveValues(clickedMarker = NULL)

observeEvent(input$map_click, {
click <- input$map_click
click_lat <- click$lat
click_long <- click$lng

clicked_markers$clickedMarker <- c(clicked_markers$clickedMarker, 1)
id <- length(clicked_markers$clickedMarker)


# Add the marker to the map
leafletProxy('map') %>%
addMarkers(lng = click_long, lat = click_lat, group = 'new_circles',
options = markerOptions(draggable = TRUE), layerId = id)

# add new point to dataframe
df_r$new_data <- rbind(rep(NA, ncol(df)), df_r$new_data)
df_r$new_data$longitude[1] <- click_long
df_r$new_data$latitude[1] <- click_lat
})

# update coordinates of marker on mouseout
# how do I select the right row in the dataframe? layerId?
observeEvent(input$map_marker_mouseout,{
click_marker <- input$map_marker_mouseout
id <- input$map_marker_mouseout$id

if(click_marker$lng != df_r$new_data$longitude[id] | click_marker$lat != df_r$new_data$latitude[id]){ # why is this always true??
df_r$new_data$longitude[id] <- click_marker$lng
df_r$new_data$latitude[id] <- click_marker$lat
}
})

output$table <- renderDataTable({df_r$new_data})
}

shinyApp(ui = ui, server = server)

最佳答案

我花了一些时间来整理我在评论中建议的方法的示例。我尝试内嵌评论。如果有任何事情需要额外说明,请告诉我。我通常会使用 purrr,但我避免删除额外的依赖项和额外的所需知识。

示例

    library(leaflet)
library(leaflet.extras)
library(shiny)

lf <- leaflet() %>%
addTiles() %>%
addDrawToolbar(editOptions = editToolbarOptions(edit=TRUE))

# kind of ugly but do in global for now so we can see
# what is happening
drawn <- list()

shinyApp(
lf,
function(input, output, session) {
observeEvent(input$undefined_draw_new_feature, {
# we can clean this up
drawn <<- c(drawn, list(input$undefined_draw_new_feature))
})

observeEvent(input$undefined_draw_edited_features, {
edited <<- input$undefined_draw_edited_features
# find the edited features and update drawn
# start by getting the leaflet ids to do the match
ids <- unlist(lapply(drawn, function(x){x$properties$`_leaflet_id`}))
# now modify drawn to match edited
map(edited$features, function(x){
loc <- match(x$properties$`_leaflet_id`, ids)
drawn[loc] <<- list(x)
})
})
}
)


# after you close the Shiny app
# you should have a drawn with all features drawn and modified
# we should also have an edited to confirm actions

str(drawn, max.level=2)
str(edited, max.level=3)

关于r - 在传单 Shiny 中拖动标记后如何更新坐标?,我们在Stack Overflow上找到一个类似的问题: https://stackoverflow.com/questions/41549325/

26 4 0
Copyright 2021 - 2024 cfsdn All Rights Reserved 蜀ICP备2022000587号
广告合作:1813099741@qq.com 6ren.com