1

我正在尝试添加像悬停在 highcharter 图表标题上的信息框。当用户将鼠标悬停在标题上时,它应该显示有关图表的一些信息。这可以在 R 中使用 Highcharter 来实现吗?

谢谢你!这是我想为标题添加悬停属性的示例代码。

library(dplyr)
library(stringr)
library(purrr)

n <- 5

set.seed(123)

colors <- c("#d35400", "#2980b9", "#2ecc71", "#f1c40f", "#2c3e50", "#7f8c8d")
colors2 <- c("#000004", "#3B0F70", "#8C2981", "#DE4968", "#FE9F6D", "#FCFDBF")


df <- data.frame(x = seq_len(n) - 1) %>% 
  mutate(
    y = 10 + x + 10 * sin(x),
    y = round(y, 1),
    z = (x*y) - median(x*y),
    e = 10 * abs(rnorm(length(x))) + 2,
    e = round(e, 1),
    low = y - e,
    high = y + e,
    value = y,
    name = sample(fruit[str_length(fruit) <= 5], size = n),
    color = rep(colors, length.out = n),
    segmentColor = rep(colors2, length.out = n)
  )

create_hc <- function(t) {

  dont_rm_high_and_low <- c("arearange", "areasplinerange",
                            "columnrange", "errorbar")

  is_polar <- str_detect(t, "polar")

  t <- str_replace(t, "polar", "")

  if(!t %in% dont_rm_high_and_low) df <- df %>% select(-e, -low, -high)


  highchart() %>%
    hc_title(text = paste(ifelse(is_polar, "polar ", ""), t, '\u2370'),
             style = list(fontSize = "15px")) %>% 
    hc_chart(type = t,
             polar = is_polar) %>% 
    hc_xAxis(categories = df$name) %>% 
    hc_add_series(df, name = "Fruit Consumption", showInLegend = FALSE) 

}

hcs <- c("line")  %>% 
  map(create_hc) 
4

0 回答 0