将鼠标悬停在R中时会弹出弹出窗口? [英] Popup when hover with leaflet in R?

查看:75
本文介绍了将鼠标悬停在R中时会弹出弹出窗口?的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

我的传单地图看起来像这样:

My leaflet map looks something like this:

library(sp)
library(leaflet)
circleFun <- function(center = c(0,0),diameter = 1, npoints = 100){
  r = diameter / 2
  tt <- seq(0,2*pi,length.out = npoints)
  xx <- center[1] + r * cos(tt)
  yy <- center[2] + r * sin(tt)
  Sr1 = Polygon(cbind(xx, yy))
  Srs1 = Polygons(list(Sr1), "s1")
  SpP = SpatialPolygons(list(Srs1), 1:1)
  return(SpP)
}
Circle.Town <- circleFun(c(1,-1),2.3,npoints = 100)

df1 <- data.frame(long=c(0.6,1,1.4), lat=c(-2, -.8, -0.2), other=c('a', 'b', 'c'), VAM=c(10,8,6), 
                  type=c('Public', 'Public', 'Private'), id=c(1:3)) %>% 
  mutate(X=paste0('<strong>id: </strong>', 
                  id,
                  '<br><strong>type</strong>: ',
                  type,
                  '<br><strong>VAM</strong>: ',
                  VAM))

# Create a continuous palette function
pal <- colorNumeric(
  palette = "RdYlBu",
  domain = df1$VAM
)

leaflet(height = "400px") %>% 
  addTiles() %>%
  addPolygons(data = Circle.Town, color = 'green',  fillOpacity = .7) %>%
  addCircleMarkers(data = df1, lat = ~lat, lng =~long, 
                   radius = ~VAM, popup = ~as.character(X), 
                   fillColor = ~pal(VAM),
                   stroke = FALSE, fillOpacity = 0.8,
                   clusterOptions = markerClusterOptions()) %>% 
  addLegend(position = "topright",
            pal = pal, values = df1$VAM,
            title = "VAM",
            opacity = 1
  ) %>% 
  setView(lng = 1, lat = -1, zoom = 8)

现在,当我单击其中一个圆圈时,会弹出一个窗口.当我将鼠标悬停而不是单击时,是否可以获得信息?理想情况下,我想要类似.

Right now, I get a popup when I click one of the circles. Is it possible to get the information when I hover the mouse instead of click? Ideally, I would like something like this.

谢谢!

推荐答案

自一年前提出此问题以来,可能已将其添加到传单包中,但这可以通过label参数完成.我正在使用传单R软件包1.1.0版.

This may have been added to the leaflet package since this question was posed a year ago, but this can be done via the label argument. I am using leaflet R package version 1.1.0.

按上述方式读取数据:

library(sp)
library(leaflet)
library(dplyr)

circleFun <- function(center = c(0,0),diameter = 1, npoints = 100){
  r = diameter / 2
  tt <- seq(0,2*pi,length.out = npoints)
  xx <- center[1] + r * cos(tt)
  yy <- center[2] + r * sin(tt)
  Sr1 = Polygon(cbind(xx, yy))
  Srs1 = Polygons(list(Sr1), "s1")
  SpP = SpatialPolygons(list(Srs1), 1:1)
  return(SpP)
}
Circle.Town <- circleFun(c(1,-1),2.3,npoints = 100)

df1 <- data.frame(long=c(0.6,1,1.4), lat=c(-2, -.8, -0.2), other=c('a', 'b', 'c'), VAM=c(10,8,6), 
  type=c('Public', 'Public', 'Private'), id=c(1:3)) %>% 
  mutate(X=paste0('<strong>id: </strong>', 
    id,
    '<br><strong>type</strong>: ',
    type,
    '<br><strong>VAM</strong>: ',
    VAM))

# Create a continuous palette function
pal <- colorNumeric(
  palette = "RdYlBu",
  domain = df1$VAM
)

但是创建标签列表,而不是矢量列表:

But create a list of labels instead of vector:

labs <- as.list(df1$X)

,然后在label参数内的那个列表上lapply HTML函数.请注意使用label代替popup.

And then lapply the HTML function over that list within the label argument. Note to use label instead of popup.

library(htmltools)
leaflet(height = "400px") %>% 
  addTiles() %>%
  addPolygons(data = Circle.Town, color = 'green',  fillOpacity = .7) %>%
  addCircleMarkers(data = df1, lat = ~lat, lng =~long, 
    radius = ~VAM, label = lapply(labs, HTML), 
    fillColor = ~pal(VAM),
    stroke = FALSE, fillOpacity = 0.8,
    clusterOptions = markerClusterOptions()) %>% 
  addLegend(position = "topright",
    pal = pal, values = df1$VAM,
    title = "VAM",
    opacity = 1
  ) %>% 
  setView(lng = 1, lat = -1, zoom = 8)

此方法问题的答案中描述了此方法:

This method is described in an an answer to this SO question: R and Leaflet: How to arrange label text across multiple lines

传单文档中的标签中提供了有关HTML的更多信息: https://rstudio.github.io/leaflet/popups.html

There is more info on HTML in labels in leaflet documentation: https://rstudio.github.io/leaflet/popups.html

这篇关于将鼠标悬停在R中时会弹出弹出窗口?的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

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