简体   繁体   English

从默认更改ggplot2 :: facet_wrap标题

[英]changing ggplot2::facet_wrap title from the default

Is there any possible way to change the labels for the facet_wrap variable, as displayed below. 是否有任何可能的方法来更改facet_wrap变量的标签,如下所示。 So, for example, instead of cyl: 4 , cyl: 6 , cyl: 8 , I want it to read condition: 4 , condition: 6 , condition: 8 . 因此,例如,我希望它读取condition: 4condition: 6condition: 8 ,而不是cyl: 4cyl: 6cyl: 8 condition: 8 Of course, I can just do this by renaming the variable, but that's not what I want. 当然,我可以通过重命名变量来做到这一点,但这不是我想要的。 This is a much simpler version of a custom function where I can't just rename a variable anyway I like. 这是自定义函数的简单得多的版本,在这里我不能随便重命名一个变量。

Another way to put this is, do I have any freedom to label the facet_wrap anyway I like? 另一种表达方式是,我是否可以自由选择自己喜欢的facet_wrap标签? Kinda like how x aesthetic variable in ggplot2 can have some name (eg cyl ) in the dataframe ( mtcars ), but I can still replace it with my own name using labs(x = "cylinder") ). 有点像ggplot2 x美感变量如何在数据帧( mtcars )中具有某些名称(例如cyl ),但是我仍然可以使用labs(x = "cylinder") )用我自己的名称替换它。 I want to have something similar for facet_wrap . 我想要facet_wrap有类似的facet_wrap

library(dplyr)
library(datasets)
library(ggplot2)
data(mtcars)

# creating a dataframe
df <- dplyr::group_by(mtcars, .dots = c('cyl', 'am')) %>%
  dplyr::summarize(counts = n()) %>%
  dplyr::mutate(perc = (counts / sum(counts)) * 100) %>%
  dplyr::arrange(desc(perc))

# preparing the plot
ggplot2::ggplot(df, aes('', counts)) +
  geom_col(
    position = 'fill',
    color = 'black',
    width = 1,
    aes(fill = factor(am))
  ) +
  facet_wrap(~cyl, labeller = "label_both") + # faceting by `cyl` variable
  geom_label(
    aes(label = paste0(round(perc), "%"), group = factor(am)),
    position = position_fill(vjust = 0.5),
    color = 'black',
    size = 5,
    show.legend = FALSE
  ) +
  coord_polar(theta = "y")

Created on 2018-02-19 by the reprex package (v0.2.0). reprex软件包 (v0.2.0)于2018-02-19创建。

To change the facet labels you can provide a named vector of labels to the labeller argument in facet_wrap : 要改变小标签可以提供标签到的命名载体labeller的参数facet_wrap

labeller = labeller(cyl = 
    c("4" = "condition: 4",
      "6" = "condition: 6",
      "8" = "condition: 8"))

Here is the full plot code: 这是完整的绘图代码:

ggplot2::ggplot(df, aes('', counts)) +
  geom_col(
    position = 'fill',
    color = 'black',
    width = 1,
    aes(fill = factor(am))
  ) +
  facet_wrap(~cyl, labeller = labeller(cyl = 
    c("4" = "condition: 4",
      "6" = "condition: 6",
      "8" = "condition: 8")
  )) 
  geom_label(
    aes(label = paste0(round(perc), "%"), group = factor(am)),
    position = position_fill(vjust = 0.5),
    color = 'black',
    size = 5,
    show.legend = FALSE
  ) +
  coord_polar(theta = "y")

在此处输入图片说明

EDIT based on the comments where a function to return labels is requested: 根据评论进行编辑,其中请求返回标签的功能:

perhaps something like this: 也许是这样的:

label_facet <- function(original_var, custom_name){
  lev <- levels(as.factor(original_var))
  lab <- paste0(custom_name, ": ", lev)
  names(lab) <- lev
  return(lab)  
}


ggplot2::ggplot(df, aes('', counts)) +
  geom_col(
    position = 'fill',
    color = 'black',
    width = 1,
    aes(fill = factor(am))
  ) +
  facet_wrap(~cyl, labeller = labeller(cyl = label_facet(df$cyl, "grouping"))) +
geom_label(
  aes(label = paste0(round(perc), "%"), group = factor(am)),
  position = position_fill(vjust = 0.5),
  color = 'black',
  size = 5,
  show.legend = FALSE
) +
  coord_polar(theta = "y")

在此处输入图片说明

sessionInfo()

R version 3.4.2 (2017-09-28)
Platform: x86_64-w64-mingw32/x64 (64-bit)
Running under: Windows >= 8 x64 (build 9200)

Matrix products: default

locale:
[1] LC_COLLATE=English_United States.1252  LC_CTYPE=English_United States.1252    LC_MONETARY=English_United States.1252
[4] LC_NUMERIC=C                           LC_TIME=English_United States.1252    

attached base packages:
[1] stats     graphics  grDevices utils     datasets  methods   base     

other attached packages:
[1] bindrcpp_0.2  ggplot2_2.2.1 dplyr_0.7.4   RMOA_1.0      rJava_0.9-9   RMOAjars_1.0 

loaded via a namespace (and not attached):
 [1] Rcpp_0.12.14      bindr_0.1         magrittr_1.5      munsell_0.4.3     colorspace_1.3-2  R6_2.2.2          rlang_0.1.4      
 [8] plyr_1.8.4        tools_3.4.2       grid_3.4.2        gtable_0.2.0      yaml_2.1.14       lazyeval_0.2.1    assertthat_0.2.0 
[15] digest_0.6.13     tibble_1.4.1      glue_1.2.0        labeling_0.3      compiler_3.4.2    pillar_1.0.1      scales_0.5.0.9000
[22] pkgconfig_2.0.1  

You can do this: 你可以这样做:

  ggplot2::ggplot(df, aes('', counts)) +
  geom_col(
    position = 'fill',
    color = 'black',
    width = 1,
    aes(fill = factor(am))
  ) +
  facet_wrap(~cyl, labeller = as_labeller(c(`4` = "Condition: 4", `6` = "Condition: 6", `8` = "Condition: 8"))) + # faceting by `cyl` variable
  geom_label(
    aes(label = paste0(round(perc), "%"), group = factor(am)),
    position = position_fill(vjust = 0.5),
    color = 'black',
    size = 5,
    show.legend = FALSE
  ) +
  coord_polar(theta = "y")

声明:本站的技术帖子网页,遵循CC BY-SA 4.0协议,如果您需要转载,请注明本站网址或者原文地址。任何问题请咨询:yoyou2525@163.com.

 
粤ICP备18138465号  © 2020-2024 STACKOOM.COM