将ggplot ellips限制为现实/可能的值

时间:2017-08-18 16:50:14

标签: r ggplot2 ggproto

使用ggplot绘制椭圆时,是否可以将椭圆约束为实际可能的值?

例如,以下可重现的代码和数据绘制了两个物种的Ele vs. Var。 Var是一个正变量,不能为负数。尽管如此,负值仍包含在结果椭圆中。是否可以在x轴上将椭圆限制为0(使用ggplot)?

更具体地说,我想象的是一个扁平边缘,椭圆体在x轴上截断为0。

library(ggplot2)
set.seed(123)
df <- data.frame(Species = rep(c("BHS", "MTG"), each = 100),
                 Ele = c(sample(1500:3000, 100), sample(2500:3500, 100)),
                 Var = abs(rnorm(200)))

ggplot(df, aes(Var, Ele, color = Species)) +
  geom_point() +
  stat_ellipse(aes(fill = Species), geom="polygon",level=0.95,alpha=0.2) 

enter image description here

2 个答案:

答案 0 :(得分:6)

您可以编辑默认属性以将点数剪切为特定值。在这里,我们将基本属性更改为修剪小于0到0的x值

StatClipEllipse <- ggproto("StatClipEllipse", Stat,
    required_aes = c("x", "y"),
    compute_group = function(data, scales, type = "t", level = 0.95,
       segments = 51, na.rm = FALSE) {
           xx <- ggplot2:::calculate_ellipse(data = data, vars = c("x", "y"), type = type,
               level = level, segments = segments)
           xx %>% mutate(x=pmax(x, 0))
      }
)

然后我们必须将它包装在与stat_ellipe相同的ggplot统计中,除了它使用我们的自定义Stat对象

stat_clip_ellipse <- function(mapping = NULL, data = NULL,
                         geom = "path", position = "identity",
                         ...,
                         type = "t",
                         level = 0.95,
                         segments = 51,
                         na.rm = FALSE,
                         show.legend = NA,
                         inherit.aes = TRUE) {
  layer(
    data = data,
    mapping = mapping,
    stat = StatClipEllipse,
    geom = geom,
    position = position,
    show.legend = show.legend,
    inherit.aes = inherit.aes,
    params = list(
      type = type,
      level = level,
      segments = segments,
      na.rm = na.rm,
      ...
    )
  )
}

然后你可以用它来制作你的情节

ggplot(df, aes(Var, Ele, color = Species)) +
  geom_point() +
  stat_clip_ellipse(aes(fill = Species), geom="polygon",level=0.95,alpha=0.2) 

enter image description here

这受到source code for stat_ellipse的启发。

答案 1 :(得分:2)

根据我上面的评论,我为可视化创建了一个误导性较小的选项。这忽略了y均匀分布的问题,因为这比严重偏斜的x变量的问题稍微不那么严重。

这两个选项都使用ggforce package,这是ggplot2的扩展名,但为了以防万一,我还包含了我使用的特定函数的来源。

library(ggforce)
library(scales)


# power_trans <- function (n) 
# {
#     scales::trans_new(name = paste0("power of ", fractions(n)), transform = function(x) {
#         x^n
#     }, inverse = function(x) {
#         x^(1/n)
#     }, breaks = scales::extended_breaks(), format = scales::format_format(), 
#         domain = c(0, Inf))
# }

选项1:

ggplot(df, aes(Var, Ele, color = Species)) +
  geom_point() + 
  stat_ellipse(aes(fill = Species), geom="polygon",level=0.95,alpha=0.2) +
  scale_x_sqrt(limits = c(-0.1,3.5), 
               breaks = c(0.0001,1:4), 
               labels = 0:4,
               expand = c(0.00,0))

enter image description here

此选项沿着平方根变换拉伸x轴,展开聚集在零附近的点。然后它计算这个新空间的椭圆。

  • 优点:看起来像椭圆形。
  • 缺点:为了让它更好玩并在x轴上标记Var=0点,你必须使用expand = c(0,0),它会严格限制限制,所以需要更多的摆弄带有手动限制/中断/标签,包括选择一个非常小的值(0.0001)表示为0。
  • 缺点:x值不沿轴线性分布,这在读取图形时需要更多的认知负荷。

选项2:

ggplot(df, aes(sqrt(Var), Ele, color = Species)) +
  geom_point() + 
  stat_ellipse() +
  coord_trans(x = ggforce::power_trans(2)) + 
  scale_x_continuous(breaks = sqrt(0:4), labels = 0:4,
                     name = "Var")

enter image description here

此选项会绘制预转换的sqrt(Var)(注意aes(...))。然后,它根据这个新的近似正常值计算省略号。然后它伸出x轴,使Var的值再次线性间隔,这会使同一变换中的椭圆扭曲。

  • 优势:看起来很酷。
  • 优点:Var的值很容易在x轴上解释。
  • 优势:您可以看到Var = 0附近的密度,其中包括&#34; egg&#34;容易。
  • 优势:尖端显示密度在这些值上有多低。
  • 缺点:看起来不熟悉,需要解释和额外的认知负荷才能解释。