带有ggplot2的Excel图形 [英] Excel graphics with ggplot2

查看:52
本文介绍了带有ggplot2的Excel图形的处理方法,对大家解决问题具有一定的参考价值,需要的朋友们下面随着小编来一起学习吧!

问题描述

我的公司想在R中进行报告,他们希望将尽可能多的Excel报告保持相同. ggplot2中是否有一种方法可以使人在Excel中获得俗气的3D外观?我想绘制一个如下图所示的图:

My company wants to do reporting in R, they want to keep as much of the Excel report the same as possible. Is there a way in ggplot2 to keep the cheesy 3-D look one gets in Excel? I'm wanting to make a plot that looks like what is below:

我已经可以接近了.这是我到目前为止的内容:

I've been able to get close. Here is what I have so far:

gender <- c("Male", "Male", "Female", "Male", "Male", "Female", "Male", "Male", "Female", "Male", 
                          "Male", "Female")
race <- c("African American", "Caucasian", "Hispanic", "African American", "African American", 
                      "Caucasian", "Hispanic", "Other", "African American", "Caucasian", "African American", 
                      "Other")

data <- as.data.frame(cbind(gender, race))


gender_data <- data %>%
  count(gender = factor(gender)) %>%
  ungroup() %>%
  mutate(pct = prop.table(n))


race_data <- data %>%
  count(race = factor(race)) %>%
  ungroup() %>%
  mutate(pct = prop.table(n))


names(race_data)[names(race_data) == 'race'] <- 'value'
names(gender_data)[names(gender_data) == 'gender'] <- 'value'



# Function for fixing x axis that creeps into other values
addline_format <- function(x,...){
  gsub('\\s','\n',x)
}

ggplot() +
          geom_bar(stat = 'identity', position = 'dodge', fill = "#5f1b46",
                   aes(x = gender_data$value, y = gender_data$pct)) +
          geom_bar(stat = 'identity', position = 'dodge', fill = "#3b6b74",
                   aes(x = race_data$value, y = race_data$pct)) +
          geom_text(aes(x = gender_data$value, y = gender_data$pct + .03, 
                        label = paste0(round(gender_data$pct * 100, 0), '%')),
                    position = position_dodge(width = .9), size = 5) +
          geom_text(aes(x = race_data$value, y = race_data$pct + .03, 
                        label = paste0(round(race_data$pct * 100, 0), '%')),
                    position = position_dodge(width = .9), size = 5) +
          scale_x_discrete(limits = c("Male", "Female", "African American", "Caucasian", "Hispanic", "Other"),
                           breaks = unique(c("Male", "Female", "African American", "Caucasian", "Hispanic", 
                                             "Other")),
                           labels = addline_format(c("Male", "Female", "African American", "Caucasian", 
                                                     "Hispanic", "Other"))) +
          labs(x = '', y = '') +
          scale_y_continuous(labels = scales::percent,
                     breaks = seq(0, 1, .2)) +
          expand_limits(y = c(0, 1)) +
          theme(panel.grid.major.x = element_blank() ,
                panel.grid.major.y = element_line( size=.1, color="light gray"),
                panel.background = element_rect(fill = '#f9f3e5'),
                plot.background = element_rect(fill = '#f9f3e5'))

输出在下面,在这一点上任何帮助将不胜感激.我还需要在性别和种族领域之间留出一定的空间,如果任何人也可以提供帮助的话:

The output is below, at this point any help would be appreciated. I also need to put a space between the gender and race fields, if anyone can help with that as well:

推荐答案

我认为我们都同意Excel的伪3D图表充满了问题,但是我很同情那些必须与那些签署3D图表的人妥协的情况薪水.

I think we all agree that Excel's pseudo-3D charts are choke full of problems, but I'm sympathetic to situations where one has to compromise with those signing the paycheck.

我还需要更好的爱好.

第1步.重塑数据(即正常内容):

Step 1. Loading & reshaping the data (i.e. the normal stuff):

library(dplyr); library(tidyr)

# original data as provided by OP
gender <- c("Male", "Male", "Female", "Male", "Male", "Female", "Male", "Male", "Female", "Male", 
            "Male", "Female")
race <- c("African American", "Caucasian", "Hispanic", "African American", "African American", 
          "Caucasian", "Hispanic", "Other", "African American", "Caucasian", "African American", 
          "Other")
data <- as.data.frame(cbind(gender, race))

# data wrangling
data.gather <- data %>% gather() %>%
  group_by(key, value) %>% summarise(count = n()) %>%
  mutate(prop = count / sum(count)) %>% ungroup() %>%
  mutate(value = factor(value, levels = c("Male", "Female", "African American",
                                          "Caucasian", "Hispanic", "Other")),
         value.int = as.integer(value))

rm(data, gender, race)

第2步.为3D效果条(即粗糙的东西)定义多边形坐标:

Step 2. Define polygon coordinates for 3D-effect bars (i.e. the cringy stuff):

# top
data.polygon.top <- data.gather %>%
  select(key, value.int, prop) %>%
  mutate(x1 = value.int - 0.25, y1 = prop,
         x2 = value.int - 0.15, y2 = prop + 0.02,
         x3 = value.int + 0.35, y3 = prop + 0.02,
         x4 = value.int + 0.25, y4 = prop) %>%
  select(-prop) %>%
  gather(k, v, -value.int, -key) %>%
  mutate(dir = str_extract(k, "x|y")) %>%
  mutate(k = as.integer(gsub("x|y", "", k))) %>%
  spread(dir, v) %>%
  rename(id = value.int, order = k) %>%
  mutate(group = paste0(id, ".", "top"))

# right side
data.polygon.side <- data.gather %>%
  select(key, value.int, prop) %>%
  mutate(x1 = value.int + 0.25, y1 = 0,
         x2 = value.int + 0.25, y2 = prop,
         x3 = value.int + 0.35, y3 = prop + 0.02,
         x4 = value.int + 0.35, y4 = 0.02) %>%
  select(-prop) %>%
  gather(k, v, -value.int, -key) %>%
  mutate(dir = str_extract(k, "x|y")) %>%
  mutate(k = as.integer(gsub("x|y", "", k))) %>%
  spread(dir, v) %>%
  rename(id = value.int, order = k) %>%
  mutate(group = paste0(id, ".", "bottom"))

data.polygon <- rbind(data.polygon.top, data.polygon.side)
rm(data.polygon.top, data.polygon.side)

第3步.:将它们放在一起:

ggplot(data.gather,
       aes(x = value.int, group = value.int, y = prop, fill = key)) +

  # "floor" of 3D panel
  geom_rect(xmin = -5, xmax = 10, ymin = 0, ymax = 0.02,
            fill = "grey", color = "black") +

  # background of 3D panel (offset by 2% vertically)
  geom_hline(yintercept = seq(0, 1, by = 0.2) + 0.02, color = "grey") +

  # 3D effect on geom bars
  geom_polygon(data = data.polygon,
               aes(x = x, y = y, group = group, fill = key),
               color = "black") +

  geom_col(width = 0.5, color = "black") +
  geom_text(aes(label = scales::percent(prop)),
            vjust = -1.5) +
  scale_x_continuous(breaks = seq(length(levels(data.gather$value))),
                     labels = levels(data.gather$value),
                     name = "", expand = c(0.2, 0)) +
  scale_y_continuous(breaks = seq(0, 1, by = 0.2),
                     labels = scales::percent, name = "",
                     expand = c(0, 0)) +
  scale_fill_manual(values = c(gender = "#5f1b46",
                               race = "#3b6b74"),
                    guide = F) +
  facet_grid(~key, scales = "free_x", space = "free_x") +
  theme(panel.spacing = unit(0, "npc"), #remove spacing between facets
        strip.text = element_blank(), #remove facet header
        axis.line = element_line(colour = "black", linetype = 1),
        panel.grid.major = element_blank(),
        panel.grid.minor = element_blank(),
        panel.background = element_rect(fill = '#f9f3e5'),
        plot.background = element_rect(fill = '#f9f3e5'))

注意:如果您注释掉geom_rect()/geom_hline()/geom_polygon()几何图形&停止在theme()中隐藏构面间距/标头,这几乎是 可呈现的...

Note: if you comment out the geom_rect() / geom_hline() / geom_polygon() geoms & stop hiding the facet spacing / header in theme(), this would be almost presentable...

这篇关于带有ggplot2的Excel图形的文章就介绍到这了,希望我们推荐的答案对大家有所帮助,也希望大家多多支持IT屋!

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