Urban Institute R Graphics Guide

R is a powerful, open-source programming language and environment. R excels at data management and munging, traditional statistical analysis, machine learning, and reproducible research, but it is probably best known for its graphics. This guide contains examples and instructions for popular and lesser-known plotting techniques in R. It also includes instructions for using urbnthemes, the Urban Institute’s R package for creating near-publication-ready plots with ggplot2. If you have any questions, please don’t hesitate to contact Aaron Williams (awilliams@urban.org) or Kyle Ueyama (kueyama@urban.org).

Background

library(urbnthemes) makes ggplot2 output align more closely with the Urban Institute’s Data Visualization style guide. This package does not produce publication ready graphics. Visual styles must still be edited using your project/paper’s normal editing workflow.

Exporting charts as a pdf will allow them to be more easily edited. See the Saving Plots section for more information.

The theme has been tested against ggplot2 version 3.0.0. It will not function properly with older versions of ggplot2

Using library(urbnthemes)

Run the following code to install or update urbnthemes:

install.packages("remotes")
remotes::install_github("UrbanInstitute/urbnthemes")

Run the following code at the top of each script:

library(tidyverse)
library(urbnthemes)

set_urbn_defaults(style = "print")

Installing Lato

Your Urban computer may not have the Lato font installed. If it is not installed, please install the free Lato font from Google. Below are step by step instructions:

  1. Download the Lato font (as a zip file).
  2. Unzip the file on your computer.
  3. For each .ttf file in the unzipped Lato/ folder, double click the file and click Install (on Windows) or Install Font (on Mac).
  4. Import and register Lato into R by running urbnthemes::lato_import() in the console once. Be patient as this may take a few minutes!
  5. To confirm installation, run urbnthemes::lato_test(). If this is successful you’re done and Lato will automatically be used when creating plots with library(urbnthemes). You only need to install Lato once per computer.

Waffle charts with glyphs require fontawesome. fontawesome_test() and fontawesome_install() are the fontawesome versions of the above functions. Be sure to install fontawesome from here first.

Grammar of Graphics and Conventions

Hadley Wickham’s ggplot2 is based on Leland Wilkinson’s The Grammar of Graphics and Wickham’s A Layered Grammar of Graphics. The layered grammar of graphics is a structured way of thinking about the components of a plot, which then lend themselves to the simple structure of ggplot2.

  • Data are what are visualizaed in a plot and mappings are directions for how data are mapped in a plot in a way that can be perceived by humans.
  • Geoms are representations of the actual data like points, lines, and bars.
  • Stats are statistical transformations that represent summaries of the data like histograms.
  • Scales map values in the data space to values in the aesthetic space. Scales draw legends and axes.
  • Coordinate Systems describe how geoms are mapped to the plane of the graphic.
  • Facets break the data into meaningful subsets like small multiples.
  • Themes control the finer points of a plot such as fonts, font sizes, and background colors.

More information: ggplot2: Elegant Graphics for Data Analysis

Tips and Tricks

  • ggplot2 expects data to be in data frames or tibbles. It is preferable for the data frames to be “tidy” with each variable as a column, each obseravtion as a row, and each observational unit as a separate table. dplyr and tidyr contain concise and effective tools for “tidying” data.

  • R allows function arguments to be called explicitly by name and implicitly by position. The coding examples in this guide only contain named arguments for clarity.

  • Graphics will sometimes render differently on different operating systems. This is because anti-aliasing is activated in R on Mac and Linux but not activated in R on Windows. This won’t be an issue once graphics are saved.

  • Continuous x-axes have ticks. Discrete x-axes do not have ticks. Use remove_ticks() to remove ticks.

Bar Plots


One Color

mtcars %>%
  count(cyl) %>%
  ggplot(mapping = aes(x = factor(cyl), y = n)) +
  geom_col() +
  geom_text(mapping = aes(label = n), vjust = -1) +    
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Cylinders",
       y = NULL) +
  remove_ticks() +
  remove_axis() 

One Color (Rotated)

This example introduces coord_flip() and remove_axis(axis = "x", flip = TRUE). remove_axis() is from library(urbnthemes) and creates a custom theme for rotated bar plots.

mtcars %>%
  count(cyl) %>%
  ggplot(mapping = aes(x = factor(cyl), y = n)) +
  geom_col() +
  geom_text(mapping = aes(label = n), hjust = -1) +  
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Cylinders",
       y = NULL) +  
  coord_flip() +
  remove_axis(axis = "x", flip = TRUE)

Three Colors

This is identical to the previous plot except colors and a legend are added with fill = cyl. Turning x into a factor with factor(cyl) skips 5 and 7 on the x-axis. Adding fill = cyl without factor() would have created a continuous color scheme and legend.

mtcars %>%
  mutate(cyl = factor(cyl)) %>%
  count(cyl) %>%
  ggplot(mapping = aes(x = cyl, y = n, fill = cyl)) +
  geom_col() +
  geom_text(mapping = aes(label = n), vjust = -1) +    
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Cylinders",
       y = NULL) +
  remove_ticks() +
  remove_axis()

Stacked Bar Plot

An additional aesthetic can easily be added to bar plots by adding fill = categorical variable to the mapping. Here, transmission type subsets each bar showing the count of cars with different numbers of cylinders.

mtcars %>%
  mutate(am = factor(am, labels = c("Automatic", "Manual")),
         cyl = factor(cyl)) %>%  
  group_by(am) %>%
  count(cyl) %>%
  group_by(cyl) %>%
  arrange(desc(am)) %>%
  mutate(label_height = cumsum(n)) %>%
  ggplot() +
  geom_col(mapping = aes(x = cyl, y = n, fill = am)) +
  geom_text(aes(x = cyl, y = label_height - 0.5, label = n, color = am)) +
  scale_color_manual(values = c("white", "black")) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Cylinders",
       y = NULL) +  
  remove_ticks() +
  remove_axis() +
  guides(color = "none")

Stacked Bar Plot With Position = Fill

The previous examples used geom_col(), which takes a y value for bar height. This example uses geom_bar() which sums the values and generates a value for bar heights. In this example, position = "fill" in geom_bar() changes the y-axis from count to the proportion of each bar.

mtcars %>%
  mutate(am = factor(am, labels = c("Automatic", "Manual")),
         cyl = factor(cyl)) %>%  
  ggplot() +
  geom_bar(mapping = aes(x = cyl, fill = am), position = "fill") +
  scale_y_continuous(expand = expansion(mult = c(0, 0.1)), labels = scales::percent) +
  labs(x = "Cylinders",
       y = NULL) +  
  remove_ticks() +
  guides(color = "none")

Dodged Bar Plot

Subsetted bar charts in ggplot2 are stacked by default. position = "dodge" in geom_col() expands the bar chart so the bars appear next to each other.

mtcars %>%
  mutate(am = factor(am, labels = c("Automatic", "Manual")),
         cyl = factor(cyl)) %>%
  group_by(am) %>%
  count(cyl) %>%
  ggplot(mapping = aes(cyl, y = n, fill = factor(am))) +
  geom_col(position = "dodge") +
  geom_text(aes(label = n), position = position_dodge(width = 0.7), vjust = -1) +    
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Cylinders",
       y = NULL) +  
  remove_ticks() +
  remove_axis()

Lollipop plot/Cleveland dot plot

Lollipop plots and Cleveland dot plots are minimalist alternatives to bar plots. The key to both plots is to order the data based on the continuous variable using arrange() and then turn the discrete variable into a factor with the ordered levels of the continuous variable using mutate(). This step “stores” the order of the data.

Lollipop plot

mtcars %>%
    rownames_to_column("model") %>%
    arrange(mpg) %>%
    mutate(model = factor(model, levels = .$model)) %>%
    ggplot(aes(mpg, model)) +
        geom_segment(aes(x = 0, xend = mpg, y = model, yend = model)) + 
        geom_point() +
        scale_x_continuous(expand = expansion(mult = c(0, 0)), limits = c(0, 40)) +
        labs(x = NULL, 
                 y = "Miles Per Gallon")

Cleveland dot plot

mtcars %>%
    rownames_to_column("model") %>%
    arrange(mpg) %>%
    mutate(model = factor(model, levels = .$model)) %>%
    ggplot(aes(mpg, model)) +
        geom_point() +
        scale_x_continuous(expand = expansion(mult = c(0, 0)), limits = c(0, 40)) +
        labs(x = NULL, 
                 y = "Miles Per Gallon")

Dumbell plot

Scatter Plots


One Color Scatter Plot

Scatter plots are useful for showing relationships between two or more variables. Use scatter_grid() from library(urbnthemes) to easily add vertical grid lines for scatter plots.

mtcars %>%
  ggplot(mapping = aes(x = wt, y = mpg)) +
  geom_point() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 6),
                     breaks = 0:6) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 40),
                     breaks = 0:8 * 5) +
  labs(x = "Weight (thousands of pounds)",
       y = "City MPG") +
  scatter_grid()

High-Density Scatter Plot with Transparency

Large numbers of observations can sometimes make scatter plots tough to interpret because points overlap. Adding alpha = with a number between 0 and 1 adds transparency to points and clarity to plots. Now it’s easy to see that jewelry stores are probably rounding up but not rounding down carats!

diamonds %>%
  ggplot(mapping = aes(x = carat, y = price)) +
  geom_point(alpha = 0.05) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 6),
                     breaks = 0:6) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 20000),
                     breaks = 0:4 * 5000,
                     labels = scales::dollar) +
  labs(x = "Carat",
       y = "Price") +
  scatter_grid()

Hex Scatter Plot

Sometimes transparency isn’t enough to bring clarity to a scatter plot with many observations. As n increases into the hundreds of thousands and even millions, geom_hex can be one of the best ways to display relationships between two variables.

diamonds %>%
  ggplot(mapping = aes(x = carat, y = price)) +
  geom_hex(mapping = aes(fill = after_stat(count))) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 6),
                     breaks = 0:6) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 20000),
                     breaks = 0:4 * 5000,
                     labels = scales::dollar) +
    scale_fill_gradientn(labels = scales::comma) +  
  labs(x = "Carat",
       y = "Price") +
  scatter_grid() +
  theme(legend.position = "right",
        legend.direction = "vertical")

Scatter Plots With Random Noise

Sometimes scatter plots have many overlapping points but a reasonable number of observations. geom_jitter adds a small amount of random noise so points are less likely to overlap. width and height control the amount of noise that is added. In the following before-and-after, notice how many more points are visible after adding jitter.

Before

mpg %>%
  ggplot(mapping = aes(x = displ, y = cty)) +
  geom_point() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 8),
                     breaks = 0:8) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 40),
                     breaks = 0:4 * 10) +
  labs(x = "Displacement",
       y = "City MPG") +
  scatter_grid()

After

set.seed(2017)
mpg %>%
  ggplot(mapping = aes(x = displ, y = cty)) +
  geom_jitter() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 8),
                     breaks = 0:8) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 40),
                     breaks = 0:4 * 10) +
  labs(x = "Displacement",
       y = "City MPG") +
  scatter_grid()

Scatter Plots with Varying Point Size

Weights and populations can be mapped in scatter plots to the size of the points. Here, the number of households in each state is mapped to the size of each point using aes(size = hhpop). Note: ggplot2::geom_point() is used instead of geom_point().

urbnmapr::statedata %>%
  ggplot(mapping = aes(x = medhhincome, y = horate)) +
  ggplot2::geom_point(mapping = aes(size = hhpop), alpha = 0.3) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(30000, 80000),
                     breaks = 3:8 * 10000,
                     labels = scales::dollar) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 0.8),
                     breaks = 0:4 * 0.2) +
  scale_radius(range = c(3, 15),
               breaks = c(2500000, 7500000, 12500000), 
               labels = scales::comma) +
  labs(x = "Household income",
       y = "Homeownership rate") +
  scatter_grid() +
    theme(plot.margin = margin(r = 20))

Scatter Plots with Fill

A third aesthetic can be added to scatter plots. Here, color signifies the number of cylinders in each car. Before ggplot() is called, Cylinders is created using library(dplyr) and the piping operator %>%.

mtcars %>%
  mutate(cyl = paste(cyl, "cylinders")) %>%
  ggplot(aes(x = wt, y = mpg, color = cyl)) +
  geom_point() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 6),
                     breaks = 0:6) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 40),
                     breaks = 0:8 * 5) +
  labs(x = "Weight (thousands of pounds)",
       y = "City MPG") +
  scatter_grid()

Line Plots


economics %>%
  ggplot(mapping = aes(x = date, y = unemploy)) +
  geom_line() +
  scale_x_date(expand = expansion(mult = c(0.002, 0)), 
               breaks = "10 years",
               limits = c(as.Date("1961-01-01"), as.Date("2020-01-01")),
               date_labels = "%Y") +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     breaks = 0:4 * 4000,
                     limits = c(0, 16000),
                     labels = scales::comma) +
  labs(x = "Year", 
       y = "Number Unemployed (1,000s)")

Lines Plots With Multiple Lines

library(gapminder)

gapminder %>%
  filter(country %in% c("Australia", "Canada", "New Zealand")) %>%
  mutate(country = factor(country, levels = c("Canada", "Australia", "New Zealand"))) %>%
  ggplot(aes(year, gdpPercap, color = country)) +
  geom_line() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     breaks = c(1952 + 0:12 * 5), 
                     limits = c(1952, 2007)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     breaks = 0:8 * 5000,
                     labels = scales::dollar, 
                     limits = c(0, 40000)) +
  labs(x = "Year",
       y = "Per capita GDP (US dollars)")

Plotting more than one variable can be useful for seeing the relationship of variables over time, but it takes a small amount of data munging.

This is because ggplot2 wants data in a “long” format instead of a “wide” format for line plots with multiple lines. gather() and spread() from the tidyr package make switching back-and-forth between “long” and “wide” painless. Essentially, variable titles go into “key” and variable values go into “value”. Then ggplot2, turns the different levels of the key variable (population, unemployment) into colors.

as_tibble(EuStockMarkets) %>%
    mutate(date = time(EuStockMarkets)) %>%
    gather(key = "key", value = "value", -date) %>%
    ggplot(mapping = aes(x = date, y = value, color = key)) +
    geom_line() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(1991, 1999), 
                     breaks = c(1991, 1993, 1995, 1997, 1999)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     breaks = 0:4 * 2500,
                     labels = scales::dollar, 
                     limits = c(0, 10000)) +  
    labs(x = "Date",
             y = "Value")

Step plot

geom_line() connects coordinates with the shortest possible straight line. Sometimes step plots are necessary because y values don’t change between coordinates. For example, the upper-bound of the Federal Funds Rate is set at regular intervals and remains constant until it is changed.

# downloaded from FRED on 2018-12-06

# https://fred.stlouisfed.org/series/DFEDTARU

fed_fund_rate <- read_csv(
  "date, fed_funds_rate
   2014-01-01,0.0025
   2015-12-16,0.0050
   2016-12-14,0.0075
   2017-03-16,0.0100
   2017-06-15,0.0125
   2017-12-14,0.0150
   2018-03-22,0.0175
   2018-06-14,0.0200
   2018-09-27,0.0225
   2018-12-06,0.0225")

fed_fund_rate %>%
  ggplot(mapping = aes(x = date, y = fed_funds_rate)) + 
  geom_step() +
  scale_x_date(expand = expansion(mult = c(0.002, 0)), 
               breaks = "1 year",
               limits = c(as.Date("2014-01-01"), as.Date("2019-01-01")),
               date_labels = "%Y") +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     breaks = c(0, 0.01, 0.02, 0.03),
                     limits = c(0, 0.03),
                     labels = scales::percent) +  
    labs(x = "Date",
             y = "Upper-bound of the Federal Funds Rate")

Path plot

The Beveridge curve is a macroeconomic plot that displays a relationship between the unemployment rate and the vacancy rate. Movements along the curve indicate changes in the business cyle and horizontal shifts of the curve suggest structural changes in the labor market.

Lines in Beveridge curves do not monotonically move from left to right. Therefore, it is necessary to use geom_path().

# seasonally-adjusted, quarterly vacancy rate - JOLTS # seasonally-adjusted, quarterly unemployment rate - CPS

# pulled from FRED on April 11, 2018. 

library(ggrepel)

beveridge <- read_csv(
    "quarter, vacanacy_rate, unempoyment_rate
    2006-01-01,0.0310,0.0473
    2006-04-01,0.0316,0.0463
    2006-07-01,0.0313,0.0463
    2006-10-01,0.0310,0.0443
    2007-01-01,0.0323,0.0450
    2007-04-01,0.0326,0.0450
    2007-07-01,0.0316,0.0466
    2007-10-01,0.0293,0.0480
    2008-01-01,0.0286,0.0500
    2008-04-01,0.0280,0.0533
    2008-07-01,0.0253,0.0600
    2008-10-01,0.0220,0.0686
    2009-01-01,0.0196,0.0826
    2009-04-01,0.0180,0.0930
    2009-07-01,0.0176,0.0963
    2009-10-01,0.0180,0.0993
    2010-01-01,0.0196,0.0983
    2010-04-01,0.0220,0.0963
    2010-07-01,0.0216,0.0946
    2010-10-01,0.0220,0.0950
    2011-01-01,0.0226,0.0903
    2011-04-01,0.0236,0.0906
    2011-07-01,0.0250,0.0900
    2011-10-01,0.0243,0.0863
    2012-01-01,0.0270,0.0826
    2012-04-01,0.0270,0.0820
    2012-07-01,0.0266,0.0803
    2012-10-01,0.0260,0.0780
    2013-01-01,0.0276,0.0773
    2013-04-01,0.0280,0.0753
    2013-07-01,0.0280,0.0723
    2013-10-01,0.0276,0.0693
    2014-01-01,0.0290,0.0666
    2014-04-01,0.0323,0.0623
    2014-07-01,0.0326,0.0610
    2014-10-01,0.0330,0.0570
    2015-01-01,0.0350,0.0556
    2015-04-01,0.0366,0.0540
    2015-07-01,0.0373,0.0510
    2015-10-01,0.0360,0.0500
    2016-01-01,0.0386,0.0493
    2016-04-01,0.0383,0.0486
    2016-07-01,0.0383,0.0493
    2016-10-01,0.0363,0.0473
    2017-01-01,0.0366,0.0466
    2017-04-01,0.0390,0.0433
    2017-07-01,0.0406,0.0430
    2017-10-01,0.0386,0.0410")

labels <- beveridge %>%
  filter(lubridate::month(quarter) == 1)

beveridge %>%
    ggplot() +
    geom_path(mapping = aes(x = unempoyment_rate, y = vacanacy_rate), alpha = 0.5) +
  geom_point(data = labels, mapping = aes(x = unempoyment_rate, y = vacanacy_rate)) +
  geom_text_repel(data = labels, mapping = aes(x = unempoyment_rate, y = vacanacy_rate, label = lubridate::year(quarter))) +  
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0.04, 0.1),
                     labels = scales::percent) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     breaks = c(0, 0.01, 0.02, 0.03, 0.04, 0.05),
                     limits = c(0, 0.05),
                     labels = scales::percent) +  
    labs(x = "Seasonally-adjusted unemployment rate",
             y = "Seasonally-adjusted vacancy rate") +  
  scatter_grid()

Slope plots

# https://www.bls.gov/lau/
library(ggrepel)

unemployment <- tibble(
    time = c("October 2009", "October 2009", "October 2009", "August 2017", "August 2017", "August 2017"),
    rate = c(7.4, 7.1, 10.0, 3.9, 3.8, 6.4),
    state = c("Maryland", "Virginia", "Washington, D.C.", "Maryland", "Virginia", "Washington, D.C.")
)

label <- tibble(label = c("October 2009", "August 2017"))
october <- filter(unemployment, time == "October 2009")
august <- filter(unemployment, time == "August 2017")

unemployment %>%
    mutate(time = factor(time, levels = c("October 2009", "August 2017")),
           state = factor(state, levels = c("Washington, D.C.", "Maryland", "Virginia"))) %>%
    ggplot() + 
    geom_line(aes(time, rate, group = state, color = state), show.legend = FALSE) +
    geom_point(aes(x = time, y = rate, color = state)) +
    labs(subtitle = "Unemployment Rate") +
    theme(axis.ticks.x = element_blank(),
                axis.title.x = element_blank(),
                axis.ticks.y = element_blank(),
        axis.title.y = element_blank(), 
        axis.text.y = element_blank(),
                panel.grid.major.y = element_blank(),
        panel.grid.minor.y = element_blank(),
        panel.grid.major.x = element_blank(),
                axis.line = element_blank()) +
    geom_text_repel(data = october, mapping = aes(x = time, y = rate, label = as.character(rate)), nudge_x = -0.06) + 
    geom_text_repel(data = august, mapping = aes(x = time, y = rate, label = as.character(rate)), nudge_x = 0.06)

Univariate


There are a number of ways to explore the distributions of univariate data in R. Some methods, like strip charts, show all data points. Other methods, like the box and whisker plot, show selected data points that communicate key values like the median and 25th percentile. Finally, some methods don’t show any of the underlying data but calculate density estimates. Each method has advantages and disadvantages, so it is worthwhile to understand the different forms. For more information, read 40 years of boxplots by Hadley Wickham and Lisa Stryjewski.

Strip Chart

Strip charts, the simplest univariate plot, show the distribution of values along one axis. Strip charts work best with variables that have plenty of variation. If not, the points tend to cluster on top of each other. Even if the variable has plenty of variation, it is often important to add transparency to the points with alpha = so overlapping values are visible.

msleep %>%
  ggplot(aes(x = sleep_total, y = factor(1))) +
  geom_point(alpha = 0.2, size = 5) +
  labs(y = NULL) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 25), 
                     breaks = 0:5 * 5) +
  scale_y_discrete(labels = NULL) +
  labs(title = "Total Sleep Time of Different Mammals",
       x = "Total sleep time (hours)",
       y = NULL) +
  theme(axis.ticks.y = element_blank())

Strip Chart with Highlighting

Because strip charts show all values, they are useful for showing where selected points lie in the distribution of a variable. The clearest way to do this is by adding geom_point() twice with filter() in the data argument. This way, the highlighted values show up on top of unhighlighted values.

ggplot() +
  geom_point(data = filter(msleep, name != "Red fox"), 
                    aes(x = sleep_total, 
                        y = factor(1)),
             alpha = 0.2, 
             size = 5,
                     color = "grey50") +
  geom_point(data = filter(msleep, name == "Red fox"),
             aes(x = sleep_total, 
                 y = factor(1), 
                 color = name),
             alpha = 0.8,
             size = 5) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 25), 
                     breaks = 0:5 * 5) +  
  scale_y_discrete(labels = NULL) +
  labs(title = "Total Sleep Time of Different Mammals",
       x = "Total sleep time (hours)",
       y = NULL,
       legend) +
  guides(color = guide_legend(title = NULL)) +
  theme(axis.ticks.y = element_blank())

Subsetted Strip Chart

Add a y variable to see the distributions of the continuous variable in subsets of a categorical variable.

library(forcats)

msleep %>%
  filter(!is.na(vore)) %>%
  mutate(vore = fct_recode(vore, 
                            "Insectivore" = "insecti",
                            "Omnivore" = "omni", 
                            "Herbivore" = "herbi", 
                            "Carnivore" = "carni"
                            )) %>%
  ggplot(aes(x = sleep_total, y = vore)) +
  geom_point(alpha = 0.2, size = 5) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 25), 
                     breaks = 0:5 * 5) +  
  labs(title = "Total Sleep Time of Different Mammals by Diet",
       x = "Total sleep time (hours)",
       y = NULL) +
  theme(axis.ticks.y = element_blank())

Beeswarm Plots

Beesward plots are a variation of strip charts that shows the distribution of data, but without the points overlaping.

library(ggbeeswarm)

txhousing %>%
    filter(city %in% c("Austin","Houston","Dallas","San Antonio","Fort Worth")) %>% 
  ggplot(aes(x = median, y = city)) +
  geom_beeswarm(alpha = 0.2, size = 5) + 
    scale_x_continuous(labels = scales::dollar) +
  labs(title = "Household Sale Price by City",
       x = "Sale Price",
       y = NULL) +
  theme(axis.ticks.y = element_blank())

Histograms

Histograms divide the distribution of a variable into n equal-sized bins and then count and display the number of observations in each bin. Histograms are sensitive to bin width. As ?geom_histogram notes, “You should always override [the default binwidth] value, exploring multiple widths to find the best to illustrate the stories in your data.”

ggplot(data = diamonds, mapping = aes(x = depth)) + 
  geom_histogram(bins = 100) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, 100)) +  
  scale_y_continuous(expand = expansion(mult = c(0, 0.2)), labels = scales::comma) +
  labs(x = "Depth",
       y = "Count")

Boxplots

Boxplots were invented in the 1970s by John Tukey1. Instead of showing the underlying data or binned counts of the underlying data, they focus on important values like the 25th percentile, median, and 75th percentile.

InsectSprays %>%
  ggplot(mapping =  aes(x = spray, y = count)) +
  geom_boxplot() +
  scale_y_continuous(expand = expansion(mult = c(0, 0.2))) +
  labs(x = "Type of insect spray",
       y = "Number of dead insects") +
  remove_ticks()

Smoothed Kernel Density Plots

Continuous variables with smooth distributions are sometimes better represented with smoothed kernel density estimates than histograms or boxplots. geom_density() computes and plots a kernel density estimate. Notice the lumps around integers and halves in the following distribution because of rounding.

diamonds %>%
  ggplot(mapping = aes(carat)) +
  geom_density(color = NA) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, NA)) +
    scale_y_continuous(expand = expansion(mult = c(0, 0.2))) +
  labs(x = "Carat",
       y = "Density")

diamonds %>%
  mutate(cost = ifelse(price > 5500, "More than $5,500 +", "$0 to $5,500")) %>%
  ggplot(mapping = aes(carat, fill = cost)) +
  geom_density(alpha = 0.25, color = NA) +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(0, NA)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Carat",
       y = "Density")

Ridgeline Plots

Ridgeline plots are partially overlapping smoothed kernel density plots faceted by a categorical variable that pack a lot of information into one elegant plot.

library(ggridges)

ggplot(diamonds, mapping = aes(x = price, y = cut)) +
    geom_density_ridges(fill = "#1696d2") +
  labs(x = "Price",
       y = "Cut")

Violin Plots

Violin plots are symmetrical displays of smooth kernel density plots.

InsectSprays %>%
  ggplot(mapping = aes(x = spray, y = count, fill = spray)) +
  geom_violin(color = NA) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.2))) +
  labs(x = "Type of insect spray",
       y = "Number of dead insects") +
  remove_ticks()

Bean Plot

Individual outliers and important summary values are not visible in violin plots or smoothed kernel density plots. Bean plots, created by Peter Kampstra in 2008, are violin plots with data shown as small lines in a one-dimensional sstrip plot and larger lines for the mean.

msleep %>%
  filter(!is.na(vore)) %>%
  mutate(vore = fct_recode(vore, 
                            "Insectivore" = "insecti",
                            "Omnivore" = "omni", 
                            "Herbivore" = "herbi", 
                            "Carnivore" = "carni"
                            )) %>%
  ggplot(aes(x = vore, y = sleep_total, fill = vore)) +
  stat_summary(fun = "mean",
               colour = "black", 
               size = 30,
               shape = 95,
               geom = "point") +
  geom_violin(color = NA) +
  geom_jitter(width = 0,
              height = 0.05,
              alpha = 0.4,
              shape = "-",
              size = 10,
                        color = "grey50") +
  scale_y_continuous(expand = expansion(mult = c(0, 0.2))) +  
    labs(x = NULL,
         y = "Total sleep time (hours)") +
  theme(legend.position = "none") +
  remove_ticks()

Area Plot


Stacked Area

txhousing %>%
  filter(city %in% c("Austin","Houston","Dallas","San Antonio","Fort Worth")) %>%
  group_by(city, year) %>%
  summarize(sales = sum(sales)) %>%
  ggplot(aes(x = year, y = sales, fill = city)) +
  geom_area(position = "stack") +
  scale_x_continuous(expand = expansion(mult = c(0, 0)),
                     limits = c(2000, 2015),
                     breaks = 2000 + 0:15) +  
  scale_y_continuous(expand = expansion(mult = c(0, 0.2)), 
                     labels = scales::comma) +
  labs(x = "Year",
       y = "Home sales")

Filled Area

txhousing %>%
  filter(city %in% c("Austin","Houston","Dallas","San Antonio","Fort Worth")) %>%
  group_by(city, year) %>%
  summarize(sales = sum(sales)) %>%
  ggplot(aes(x = year, y = sales, fill = city)) +
  geom_area(position = "fill") +
  scale_x_continuous(expand = expansion(mult = c(0, 0)),
                     limits = c(2000, 2015),
                     breaks = 2000 + 0:15) +  
  scale_y_continuous(expand = expansion(mult = c(0, 0.02)),
                     breaks = c(0, 0.25, 0.5, 0.75, 1),
                     labels = scales::percent) +
  labs(x = "Year",
       y = "Home sales")

Sankey Plot


Sankey plots visualize flows from one set of variables to another. This can be useful for showing outcomes from the start of a program to the end. You’ll need to install the ggsankey package to create Sankey plots in R. In this example I make a dummy data set of housing status prior to program start and at exit to show the flow of people between outcomes. A key step is to transform your data set using the make_long function from the package. This creates a data frame that specifies each of the initial nodes and how they flow into the next stage.

# load ggsankey package
remotes::install_github("davidsjoberg/ggsankey")
library(ggsankey)

# create a dummy dataset of housing status
df <- data_frame(entry_status = c(rep("Housed", 7), rep("Unhoused", 15), rep("Staying w/ Family", 8)), 
                 exit_status = c(rep("Housed", 15), rep("Unhoused", 2), rep("Staying w/ Family", 13))) %>% 
    # transform the data frame into the proper format for the sankey plot
  make_long(entry_status, exit_status) %>% 
    # recode the labels to be cleaner in the plot 
  mutate(x = recode(x, entry_status = "Prior Housing Status", exit_status = "Exit Housing Status"),
         next_x = recode(next_x, entry_status = "Prior Housing Status", exit_status = "Exit Housing Status"))

# create sankey plot
ggplot(df, aes(x = x, 
               next_x = next_x, 
               node = node, 
               next_node = next_node,
               fill = factor(node), 
               label = node)) +
  geom_sankey(flow.alpha = 0.5, node.color = 1, show.legend = FALSE) +
  # add labels to plot and style
  geom_sankey_label(size = 3.5, color = 1, fill = "white") +
  theme_sankey(base_size = 16)+
  labs(x = NULL)

Heat Map


library(fivethirtyeight)

bad_drivers %>%
  filter(state %in% c("Maine", "New Hampshire", "Vermont", "Massachusetts", "Connecticut", "New York")) %>%
  mutate(`Number of\nDrivers` = scale(num_drivers),
         `Percent\nSpeeding` = scale(perc_speeding),
         `Percent\nAlcohol` = scale(perc_alcohol),
         `Percent Not\nDistracted` = scale(perc_not_distracted),
         `Percent No\nPrevious` = scale(perc_no_previous),
         state = factor(state, levels = rev(state))
         ) %>%
  select(-insurance_premiums, -losses, -(num_drivers:losses)) %>%
  gather(`Number of\nDrivers`:`Percent No\nPrevious`, key = "variable", value = "SD's from Mean") %>%
  ggplot(aes(variable, state)) +
    geom_tile(aes(fill = `SD's from Mean`)) +
    labs(x = NULL,
         y = NULL) + 
    scale_fill_gradientn() +
    theme(legend.position = "right",
          legend.direction = "vertical",
          axis.line.x = element_blank(),
          panel.grid.major.y = element_blank()) +
  remove_ticks()

#https://learnr.wordpress.com/2010/01/26/ggplot2-quick-heatmap-plotting/

Faceting and Small Multiples


facet_wrap()

R’s faceting system is a powerful way to make “small multiples”.

Some edits to the theme may be necessary depending upon how many rows and columns are in the plot.

diamonds %>%
  ggplot(mapping = aes(x = carat, y = price)) +
  geom_point(alpha = 0.05) +
  facet_wrap(~cut, ncol = 5) +
  scale_x_continuous(expand = expansion(mult = c(0, 0)),
                     limits = c(0, 6)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0)),
                     limits = c(0, 20000), 
                     labels = scales::dollar) +
  labs(x = "Carat",
       y = "Price") +
  scatter_grid()

facet_grid()

diamonds %>%
  filter(color %in% c("D", "E", "F", "G")) %>%
  ggplot(mapping = aes(x = carat, y = price)) +
  geom_point(alpha = 0.05) +
  facet_grid(color ~ cut) +
  scale_x_continuous(expand = expansion(mult = c(0, 0)),
                     limits = c(0, 4)) +  
  scale_y_continuous(expand = expansion(mult = c(0, 0)),
                     limits = c(0, 20000), 
                     labels = scales::dollar) +
  labs(x = "Carat",
       y = "Price") +
  theme(panel.spacing = unit(20L, "pt")) +
  scatter_grid()

Smoothers


geom_smooth() fits and plots models to data with two or more dimensions.

Understanding and manipulating defaults is more important for geom_smooth() than other geoms because it contains a number of assumptions. geom_smooth() automatically uses loess for datasets with fewer than 1,000 observations and a generalized additive model with formula = y ~ s(x, bs = "cs") for datasets with greater than 1,000 observations. Both default to a 95% confidence interval with the confidence interval displayed.

Models are chosen with method = and can be set to lm(), glm(), gam(), loess(), rlm(), and more. Formulas can be specified with formula = and y ~ x syntax. Plotting the standard error is toggled with se = TRUE and se = FALSE, and level is specificed with level =. As always, more information can be seen in RStudio with ?geom_smooth().

geom_point() adds a scatterplot to geom_smooth(). The order of the function calls is important. The function called second will be layed on top of the function called first.

diamonds %>%
  ggplot(mapping = aes(x = carat, y = price)) +
    geom_point(alpha = 0.05) +
    geom_smooth(color =  "#ec008b") +
    scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                       limits = c(0, 5),
                       breaks = 0:5) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                     limits = c(0, 20000), 
                     labels = scales::dollar) +  
  labs(x = "Carat",
       y = "Price") +
  scatter_grid()

geom_smooth can be subset by categorical and factor variables. This requires subgroups to have a decent number of observations and and a fair amount of variability across the x-axis. Confidence intervals often widen at the ends so special care is needed for the chart to be meaningful and readable.

This example uses Loess with MPG = displacement.

ggplot(data = mpg, mapping = aes(x = displ, y = hwy, color = factor(cyl))) +
    geom_point(alpha = 0.2) +
    geom_smooth() +
    scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                       limits = c(0, 7),
                       breaks = 0:7) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                     limits = c(0, 60)) +  
    labs(x = "Engine displacement",
             y = "Highway MPG") +
  scatter_grid()

This example uses linear models with MPG = displacement.

ggplot(data = mpg, mapping = aes(x = displ, y = hwy, color = factor(cyl))) +
    geom_point(alpha = 0.2) +
    geom_smooth(method = "lm") +
    scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                       limits = c(0, 7),
                       breaks = 0:7) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                     limits = c(0, 60)) +  
    labs(x = "Engine displacement",
             y = "Highway MPG") +
  scatter_grid()

Highlighting


library(gghighlight) enables the intuitive highlighting of ggplot2 plots. gghighlight modifies existing ggplot2 objects, so no other code should change. All of the highlighting is handled by the function gghighlight(), which can handle all types of geoms.

Warning: R will throw an error if too many colors are highlighted because of the design of urbnthemes. Simply decrease the number of highlighted geoms to solve this issue.

There are two main ways to highlight.

Threshold

The first way to highlight is with a threshold. Add a logical test to gghighlight() to describe which lines should be highlighted. Here, lines with maximum change in per-capita Gross Domestic Product greater than $35,000 are highlighted by gghighlight(max(pcgpd_change) > 35000, use_direct_label = FALSE).

library(gghighlight)
library(gapminder)

data <- gapminder %>%
  filter(continent %in% c("Europe")) %>%
  group_by(country) %>%
  mutate(pcgpd_change = ifelse(year == 1952, 0, gdpPercap - lag(gdpPercap))) %>%
  mutate(pcgpd_change = cumsum(pcgpd_change))
  
data %>%
  ggplot(aes(year, pcgpd_change, group = country, color = country)) +
  geom_line() +
  gghighlight(max(pcgpd_change) > 35000, use_direct_label = FALSE) +  
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)),
                     breaks = c(seq(1950, 2010, 10)),
                     limits = c(1950, 2010)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                     breaks = 0:8 * 5000,
                     labels = scales::dollar,
                     limits = c(0, 40000)) +
  labs(x = "Year",
       y = "Change in per-capita GDP (US dollars)")

Rank

The second way to highlight is by rank. Here, the countries with the first highest values for change in per-capita Gross Domestic Product are highlighted with gghighlight(max(pcgpd_change), max_highlight = 5, use_direct_label = FALSE).

data %>%
  ggplot(aes(year, pcgpd_change, group = country, color = country)) +
  geom_line() +
  gghighlight(max(pcgpd_change), max_highlight = 5, use_direct_label = FALSE) +  
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)),
                     breaks = c(seq(1950, 2010, 10)),
                     limits = c(1950, 2010)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                     breaks = 0:8 * 5000,
                     labels = scales::dollar,
                     limits = c(0, 40000)) +
  labs(x = "Year",
       y = "Change in per-capita GDP (US dollars)")

Faceting

gghighlight() works well with ggplot2’s faceting system.

data %>%
  ggplot(aes(year, pcgpd_change, group = country)) +
  geom_line() +
  gghighlight(max(pcgpd_change), max_highlight = 4, use_direct_label = FALSE) +  
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)),
                     breaks = c(seq(1950, 2010, 10)),
                     limits = c(1950, 2010)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                     breaks = 0:8 * 5000,
                     labels = scales::dollar,
                     limits = c(0, 40000)) +
  labs(x = "Year",
       y = "Change in per-capita GDP (US dollars)") +
  facet_wrap(~ country) +
  theme(panel.spacing = unit(20L, "pt"))

Text and Annotation


Several functions can be used to annotate, label, and highlight different parts of plots. geom_text() and geom_text_repel() both display variables from data frames. annotate(), which has several different uses, displays variables and values included in the function call.

geom_text()

geom_text() turns text variables in data sets into geometric objects. This is useful for labeling data in plots. Both functions need x values and y values to determine placement on the coordinate plane, and a text vector of labels.

This can be used to label geom_bar().

diamonds %>%
  group_by(cut) %>%
  summarize(price = mean(price)) %>%
  ggplot(aes(cut, price)) +
  geom_bar(stat = "identity") +
  geom_text(aes(label = scales::dollar(price)), vjust = -1) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.2)),
                                     labels = scales::dollar) +
  labs(title = "Average Diamond Price by Diamond Cut",
       x = "Cut",
       y = "Price") +
  remove_ticks()

It can also be used to label points in a scatter plot.

It’s rarely useful to label every point in a scatter plot. Use filter() to create a second data set that is subsetted and pass it into the labelling function.

labels <- mtcars %>%
    rownames_to_column("model") %>%
    filter(model %in% c("Toyota Corolla", "Merc 240D", "Datsun 710"))

mtcars %>%
    ggplot() +
    geom_point(mapping = aes(x = wt, y = mpg)) +
    geom_text(data = labels, mapping = aes(x = wt, y = mpg, label = model), nudge_x = 0.38) +
  scale_x_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(0, 6)) + 
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(0, 40)) +  
  labs(x = "Weight (Tons)",
       y = "Miles per gallon (MPG)") +
  scatter_grid()

Text too often overlaps with other text or geoms when using geom_text(). library(ggrepel) is a library(ggplot2) add-on that automatically positions text so it doesn’t overlap with geoms or other text. To add this functionality, install and load library(ggrepel) and then use geom_text_repel() with the same syntax as geom_text().

geom_text_repel()

library(ggrepel)

labels <- mtcars %>%
    rownames_to_column("model") %>%
    top_n(5, mpg)

mtcars %>%
    ggplot(mapping = aes(x = wt, y = mpg)) +
    geom_point() +
    geom_text_repel(data = labels, 
                    mapping = aes(label = model), 
                    nudge_x = 0.38) +
  scale_x_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(0, 6)) + 
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(0, 40)) +  
  labs(x = "Weight (Tons)",
       y = "Miles per gallon (MPG)") +
  scatter_grid()

annotate()

annotate() doesn’t use data frames. Instead, it takes values for x = and y =. It can add text, rectangles, segments, and pointrange.

msleep %>%
  filter(bodywt <= 1000) %>%
  ggplot(aes(bodywt, sleep_total)) +
  geom_point() +
  scale_x_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(-10, 1000),
                                     labels = scales::comma) + 
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(0, 25)) +  
  annotate("text", x = 500, y = 12, label = "These data suggest that heavy \n animals sleep less than light animals") +
  labs(x = "Body weight (pounds)",
       y = "Sleep time (hours)") +
  scatter_grid()  

library(AmesHousing)

ames <- make_ames()

ames %>%
  mutate(square_footage = Total_Bsmt_SF - Bsmt_Unf_SF + First_Flr_SF + Second_Flr_SF) %>%
  mutate(Sale_Price = Sale_Price / 1000) %>%  
  ggplot(aes(square_footage, Sale_Price)) +
  geom_point(alpha = 0.2) +
  scale_x_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(-10, 12000),
                                     labels = scales::comma) + 
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)),
                                     limits = c(0, 800),
                                     labels = scales::dollar) +  
  annotate("rect", xmin = 6800, xmax = 11500, ymin = 145, ymax = 210, alpha = 0.1) +
  annotate("text", x = 8750, y = 230, label = "Unfinished homes") +
  labs(x = "Square footage", 
       y = "Sale price (thousands)") +
  scatter_grid()   

Layered Geoms


Geoms can be layered in ggplot2. This is useful for design and analysis.

It is often useful to add points to line plots with a small number of values across the x-axis. This example from R for Data Science shows how changing the line to grey can be appealing.

Design

Before

table1 %>%
    ggplot(aes(x = year, y = cases)) +
        geom_line(aes(color = country)) +
        geom_point(aes(color = country)) +
        scale_y_continuous(expand = expansion(mult = c(0, 0.2)), 
                           labels = scales::comma) +
        scale_x_continuous(breaks = c(1999, 2000)) +
        labs(title = "Changes in Tuberculosis Cases in Three Countries")

After

table1 %>%
    ggplot(aes(year, cases)) +
        geom_line(aes(group = country), color = "grey50") +
        geom_point(aes(color = country)) +
        scale_y_continuous(expand = expansion(mult = c(0, 0.2)), 
                           labels = scales::comma) +
        scale_x_continuous(breaks = c(1999, 2000)) +
        labs(title = "Changes in Tuberculosis Cases in Three Countries")

Centroids

mpg_summary <- mpg %>%
    group_by(cyl) %>%
    summarize(displ = mean(displ), cty = mean(cty))

mpg %>%
    ggplot() +
    geom_point(aes(x = displ, y = cty, color = factor(cyl)), alpha = 0.5) +
    geom_point(data = mpg_summary, aes(x = displ, y = cty), size = 5, color = "#ec008b") +
    geom_text(data = mpg_summary, aes(x = displ, y = cty, label = cyl)) +
  scale_x_continuous(expand = expansion(mult = c(0, 0.002)), 
                     limits = c(0, 8)) +  
  scale_y_continuous(expand = expansion(mult = c(0, 0)), 
                     limits = c(0, 40)) +
    labs(x = "Displacement",
         y = "City MPG") +
  scatter_grid()

Saving Plots


ggsave() exports ggplot2 plots. The function can be used in two ways. If plot = isn’t specified in the function call, then ggsave() automatically saves the plot that was last displayed in the Viewer window. Second, if plot = is specified, then ggsave() saves the specified plot. ggsave() guesses the type of graphics device to use in export (.png, .pdf, .svg, etc.) from the file extension in the filename.

mtcars %>%
  ggplot(aes(x = wt, y = mpg)) +
  geom_point()

ggsave(filename = "cars.png")

plot2 <- mtcars %>%
  ggplot(aes(x = wt, y = mpg)) +
  geom_point()

ggsave(filename = "cars.png", plot = plot2)

Exported plots rarely look identical to the plots that show up in the Viewer window in RStudio because the overall size and aspect ratio of the Viewer is often different than the defaults for ggsave(). Specific sizes, aspect ratios, and resolutions can be controlled with arguments in ggsave(). RStudio has a useful cheatsheet called “How Big is Your Graph?” that should help with choosing the best size, aspect ratio, and resolution.

Fonts are not embedded in PDFs by default. To embed fonts in PDFs, include device = cairo_pdf in ggsave().

plot <- mtcars %>%
  ggplot(aes(x = wt, y = mpg)) +
  geom_point()

ggsave(filename = "cars.pdf", plot = plot2, width = 6.5, height = 4, device = cairo_pdf)

Interactive Plots

We can make any of the previous plots interactive with the powerful and easy plotly library. All we have to do is wrap a ggplot object in the ggplotly function. Note: You can’t add ggplotly to the end of a ggplot object, but have to actually save the ggplot as a variable and then wrap that in the function call as shown below.

You can customize the tooltip text by adding a value to text in aes() and then specifying tooltip = "text" in the ggplotly call.

library(plotly)

stock_plot <- as_tibble(EuStockMarkets) %>% 
    mutate(date = time(EuStockMarkets)) %>% 
    gather(key = "key", value = "value", -date) %>% 
    ggplot(mapping = aes(x = date, y = value, color = key,
                                             # sometimes ggplotly messes with line charts,
                                             # adding a group value usually helps with that
                                             group = key,
                                             # customize the tooltip with the text aes
                                             text = paste0("Value: ", round(value, 2), "<br>",
                                                                        "Date: ", round(date, 3), "<br>",
                                                                        "Key: ", key))
                                             ) +
    geom_line() +
  scale_x_continuous(expand = expansion(mult = c(0.002, 0)), 
                     limits = c(1991, 1999), 
                     breaks = c(1991, 1993, 1995, 1997, 1999)) +
  scale_y_continuous(expand = expansion(mult = c(0, 0.002)), 
                     breaks = 0:4 * 2500,
                     labels = scales::dollar, 
                     limits = c(0, 10000)) +  
    labs(x = "Date",
             y = "Value")

# make interactive with gggplotly
# Uncomment pipe to hide the interative toolbar in the top right 
ggplotly(stock_plot, tooltip = "text")  # %>%  config(displayModeBar = FALSE)

urbnthemes

Overview

urbnthemes is a set of tools for creating Urban Institute-themed plots and maps in R. The package extends ggplot2 with print and map themes as well as tools that make plotting easier at the Urban Institute. urbnthemes replaces the urban_R_theme.

Always load library(urbnthemes) after library(ggplot2) or library(tidyverse).

Usage

Use set_urbn_defaults(style = "print") to set the default styles. scatter_grid(), remove_ticks(), add_axis(), and remove_axis() can all be used to improve graphics.

library(ggplot2)
library(urbnthemes)

set_urbn_defaults(style = "print")

ggplot(data = mtcars, mapping = aes(factor(cyl))) +
  geom_bar() + 
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Number of Cylinders",
       y = "Count") +
  remove_ticks()

Combining elements

library(urbnthemes) contains functions for combining plot elements into graphics. urbn_plot() brings all of the elements together.

  • urbn_logo_text()
  • remove_ticks()
  • remove_axis()
  • scatter_grid()
  • add_axis()
  • urbn_geofacet
library(ggplot2)
library(urbnthemes)

set_urbn_defaults(style = "print")

plot <- ggplot(data = mtcars, mapping = aes(factor(cyl))) +
  geom_bar() + 
  scale_y_continuous(expand = expansion(mult = c(0, 0.1))) +
  labs(x = "Number of Cylinders",
       y = "Count") +
  remove_ticks()

urbn_plot(plot, urbn_logo_text(), ncol = 1, heights = c(30, 1))

Sometimes it’s important to horizontally add the y-axis title above the plot. urbn_y_title() can be sued for this task. The following example goes one step further and adds the title between the legend and the plot.

library(ggplot2)
library(urbnthemes)

set_urbn_defaults()

plot <- ggplot(data = mtcars, mapping = aes(x = wt, y = mpg, color = factor(cyl))) +
  geom_point() + 
    scale_x_continuous(expand = c(0, 0),
                                         limits = c(0, 8)) +
  scale_y_continuous(expand = c(0, 0),
                                     limits = c(0, 40)) +
  remove_ticks() +
    labs("") +
    scatter_grid()

urbn_plot(get_legend(plot),
                    urbn_y_title("Miles per gallon"),
                    remove_legend(plot), 
                    urbn_logo_text(), 
                    ncol = 1, 
                    heights = c(3, 1, 30, 1))

Palettes

urbnthemes contains many quick-access color palettes from the Urban Institute Data Visualization Style Guide. These palettes can be used to quickly overwrite default color palettes from urbnthemes.

  • palette_urbn_main is the eight color discrete palette of the Urban Institute with cyan, yellow, black, gray, magenta, green, space gray, and red.
  • palette_urbn_diverging is an eight color diverging palette.
  • palette_urbn_quintile is a five color blue palette that is good for quintiles.
  • palette_urbn_politics is a two color palette with blue for Democrats and red for Republicans.

There are seven palettes that are continuous palettes of the seven unique colors in the discrete Urban Institute color palette:

  • palette_urbn_cyan
  • palette_urbn_gray
  • palette_urbn_yellow
  • palette_urbn_magenta
  • palette_urbn_green
  • palette_urbn_spacegray
  • palette_urbn_red

Use view_palette() to see the palette:

view_palette(palette_urbn_magenta)
[1] "c(#351123, #761548, #af1f6b, #e90989, #e54096, #e46aa7, #eb99c2, #f5cbdf)"

The vectors can be subset using base R syntax. This allows for the quick selection of specific colors from a palette.

palette_urbn_main[1:4]
     cyan    yellow     black      gray 
"#1696d2" "#fdbf11" "#000000" "#d2d2d2" 
palette_urbn_spacegray[1:5]
[1] "#d5d5d4" "#adabac" "#848081" "#5c5859" "#332d2f"

Utility functions

library(urbnthemes) contains four functions that are helpful with managing font instalations:

  • lato_test()
  • lato_install()
  • fontawesome_test()
  • fontawesome_install()

Bibliography and Session Information


Note: Examples present in this document by Aaron Williams were created during personal time.

Bob Rudis and Dave Gandy (2017). waffle: Create Waffle Chart Visualizations in R. R package version 0.7.0. https://CRAN.R-project.org/package=waffle

Chester Ismay and Jennifer Chunn (2017). fivethirtyeight: Data and Code Behind the Stories and Interactives at ‘FiveThirtyEight’. R package version 0.3.0. https://CRAN.R-project.org/package=fivethirtyeight

Hadley Wickham. ggplot2: Elegant Graphics for Data Analysis. Springer-Verlag New York, 2009.

Hadley Wickham (2017). tidyverse: Easily Install and Load the ‘Tidyverse’. R package version 1.2.1. https://CRAN.R-project.org/package=tidyverse

Hadley Wickham (2017). forcats: Tools for Working with Categorical Variables (Factors). R package version 0.2.0. https://CRAN.R-project.org/package=forcats

Jennifer Bryan (2017). gapminder: Data from Gapminder. R package version 0.3.0. https://CRAN.R-project.org/package=gapminder

Kamil Slowikowski (2017). ggrepel: Repulsive Text and Label Geoms for ‘ggplot2’. R package version 0.7.0. https://CRAN.R-project.org/package=ggrepel

Max Kuhn (2017). AmesHousing: The Ames Iowa Housing Data. R package version 0.0.3. https://CRAN.R-project.org/package=AmesHousing

Peter Kampstra (2008). Beanplot: A Boxplot Alternative for Visual Comparison of Distributions, Journal of Statistical Software, 2008. https://www.jstatsoft.org/article/view/v028c01

R Core Team (2017). R: A language and environment for statistical computing. R Foundation for Statistical Computing, Vienna, Austria. URL https://www.R-project.org/.

Winston Chang, (2014). extrafont: Tools for using fonts. R package version 0.17. https://CRAN.R-project.org/package=extrafont

Yihui Xie (2018). knitr: A General-Purpose Package for Dynamic Report Generation in R. R package version 1.19.

sessionInfo()
R version 4.2.2 (2022-10-31)
Platform: aarch64-apple-darwin20 (64-bit)
Running under: macOS Monterey 12.5.1

Matrix products: default
BLAS:   /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRblas.0.dylib
LAPACK: /Library/Frameworks/R.framework/Versions/4.2-arm64/Resources/lib/libRlapack.dylib

locale:
[1] en_US.UTF-8/en_US.UTF-8/en_US.UTF-8/C/en_US.UTF-8/en_US.UTF-8

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

other attached packages:
 [1] plotly_4.10.4         AmesHousing_0.0.4     gghighlight_0.4.0    
 [4] fivethirtyeight_0.6.2 ggsankey_0.0.99999    ggridges_0.5.4       
 [7] ggbeeswarm_0.7.1      ggrepel_0.9.2         gapminder_0.3.0      
[10] urbnthemes_0.0.2      forcats_1.0.0         stringr_1.5.1        
[13] dplyr_1.1.4           purrr_1.0.2           readr_2.1.3          
[16] tidyr_1.3.1           tibble_3.2.1          ggplot2_3.5.0        
[19] tidyverse_1.3.2       knitr_1.40           

loaded via a namespace (and not attached):
 [1] nlme_3.1-160        fs_1.5.2            lubridate_1.9.0    
 [4] bit64_4.0.5         httr_1.4.4          tools_4.2.2        
 [7] backports_1.4.1     utf8_1.2.4          R6_2.5.1           
[10] vipor_0.4.5         lazyeval_0.2.2      DBI_1.1.3          
[13] mgcv_1.8-41         colorspace_2.1-0    withr_3.0.0        
[16] tidyselect_1.2.1    gridExtra_2.3       bit_4.0.5          
[19] curl_4.3.3          compiler_4.2.2      extrafontdb_1.0    
[22] cli_3.6.2           rvest_1.0.3         xml2_1.3.3         
[25] labeling_0.4.3      scales_1.3.0        hexbin_1.28.2      
[28] digest_0.6.30       rmarkdown_2.18      pkgconfig_2.0.3    
[31] htmltools_0.5.4     extrafont_0.18      dbplyr_2.2.1       
[34] fastmap_1.1.0       htmlwidgets_1.6.1   rlang_1.1.3        
[37] readxl_1.4.1        rstudioapi_0.14     farver_2.1.1       
[40] generics_0.1.3      jsonlite_1.8.3      crosstalk_1.2.0    
[43] vroom_1.6.0         googlesheets4_1.0.1 magrittr_2.0.3     
[46] Matrix_1.5-1        Rcpp_1.0.9          munsell_0.5.1      
[49] fansi_1.0.6         lifecycle_1.0.4     stringi_1.8.3      
[52] yaml_2.3.6          grid_4.2.2          parallel_4.2.2     
[55] crayon_1.5.2        lattice_0.20-45     splines_4.2.2      
[58] haven_2.5.1         hms_1.1.2           pillar_1.9.0       
[61] urbnmapr_0.0.0.9002 reprex_2.0.2        glue_1.7.0         
[64] evaluate_0.18       data.table_1.14.4   remotes_2.4.2      
[67] renv_0.16.0         modelr_0.1.10       vctrs_0.6.5        
[70] tzdb_0.3.0          Rttf2pt1_1.3.11     cellranger_1.1.0   
[73] gtable_0.3.4        assertthat_0.2.1    xfun_0.34          
[76] broom_1.0.1         viridisLite_0.4.2   googledrive_2.0.0  
[79] gargle_1.2.1        beeswarm_0.4.0      timechange_0.1.1   
[82] ellipsis_0.3.2     

Footnotes

  1. Wickham, H., & Stryjewski, L. (2011). 40 years of boxplots.↩︎