The govstyle package is designed to give your ggplot2 figures gov.uk friendly formatting. At present the package consists of a single theme which can be applied to ggplots. More functionality will be added in the future.

A real life example

In this vignette, we will reproduce two of the plots presented in the 2015 Statistical First Release (SFR) 39 from the Department of Education. This SFR deals with statistics relating to student absence and exclusion, and is available for download here.

Getting the data

The first step is to download and prepare the data. The SFR data are stored as a large (41.7 MB) CSV file within a zip file, which is available here.

Downloading and extracting the data can all be done in R

It’s worth doing a quick check to ensure that this worked:

file.exists("SFR39_2015_Autumn_Spring_Proposed_SFR_structure.csv")
## [1] TRUE
## Should be 43776735 bytes:

file.info("SFR39_2015_Autumn_Spring_Proposed_SFR_structure.csv")$size
## [1] 43776735

We also need to install the govstyle package. This vignette uses version v0.1.0 - leaving out this argument from devtools::install_github will fetch the latest commit on the master branch

library(govstyle)

Loading and cleaning the data

If all has gone well, we can load the data and make some basic maniuplations. For this we need both readr and dplyr:

library(readr)
library(dplyr)
library(tidyr)

Here I use the dplyr framework using the pipe %>% to combine a lot of cleaning tasks into a single block of code. First I load the data from CSV using readr::read_csv(), then use dplyr::select() to subset the columns I am interested in and dplyr::mutate() to standardise the school types in lowercase.

From a quick scan of the data, we can see that all the remaining character columns have been converted to factor, and we have two remaining numeric columns which are integer.

## # A tibble: 185,543 x 7
##    Period    Level  Year   Country School_type   sess_possible sess_overall
##    <chr>     <chr>  <chr>  <chr>   <chr>                 <dbl>        <dbl>
##  1 Autumn a… NATIO… 2014/… England state-funded…     903233105     36435870
##  2 Autumn a… NATIO… 2014/… England state-funded…     685843532     35710933
##  3 Autumn a… REGION 2014/… England state-funded…      41518775      1722112
##  4 Autumn a… REGION 2014/… England state-funded…      34599612      1913808
##  5 Autumn a… REGION 2014/… England state-funded…     126645793      5031291
##  6 Autumn a… REGION 2014/… England state-funded…      94548657      4915927
##  7 Autumn a… REGION 2014/… England state-funded…      93318774      3841700
##  8 Autumn a… REGION 2014/… England state-funded…      69488849      3768854
##  9 Autumn a… REGION 2014/… England state-funded…      76578138      2985514
## 10 Autumn a… REGION 2014/… England state-funded…      59441808      3102930
## # … with 185,533 more rows

Calculating Overall Absence Rate

To recreate the plots in the SFR, we first need to calculate the national overall absence rate (OAR), which is given as:

the total number of overall absence sessions for all pupils as a percentage of the total number of possible sessions for all pupils, where overall absence is the sum of authorised and unauthorised absence and one session is equal to half a day.

or:

\[ \text{Overall absence rate} = \frac{\text{Total Overall absence sessions}}{\text{Total sessions possible}}\times 100 \]

For this we need to subset the data and calculate this at the national level, and combine this calculation with the regional data

Note that combining the two dataframes above leads to School_type being coerced to character. This is not an issue for use here.

## # A tibble: 27 x 8
##    Period  Level Year  Country School_type sess_possible sess_overall   oar
##    <chr>   <chr> <chr> <chr>   <chr>               <dbl>        <dbl> <dbl>
##  1 Autumn… NATI… 2014… England state-fund…     903233105     36435870  4.03
##  2 Autumn… NATI… 2014… England state-fund…     685843532     35710933  5.21
##  3 Autumn… NATI… 2013… England state-fund…     911885281     35463299  3.89
##  4 Autumn… NATI… 2013… England state-fund…     709723446     35851556  5.05
##  5 Autumn… NATI… 2012… England state-fund…     831691005     40082227  4.82
##  6 Autumn… NATI… 2012… England state-fund…     678134219     39659737  5.85
##  7 Autumn… NATI… 2011… England state-fund…     828937182     36378170  4.39
##  8 Autumn… NATI… 2011… England state-fund…     695063926     39709398  5.71
##  9 Autumn… NATI… 2010… England state-fund…     859062270     44163589  5.14
## 10 Autumn… NATI… 2010… England state-fund…     744809290     48559089  6.52
## # … with 17 more rows

Creating the first plot

For the first plot, we also need the values from the start and end of the timeseries for inclusion in the plot.

## # A tibble: 6 x 8
##   Period  Level Year  Country School_type  sess_possible sess_overall   oar
##   <chr>   <chr> <chr> <chr>   <chr>                <dbl>        <dbl> <dbl>
## 1 Autumn… NATI… 2006… England state-funde…     837236424     44002860  5.26
## 2 Autumn… NATI… 2006… England state-funde…     741915262     57685767  7.78
## 3 Autumn… NATI… 2006… England state-funde…    1579151686    101688627  6.44
## 4 Autumn… NATI… 2014… England state-funde…     903233105     36435870  4.03
## 5 Autumn… NATI… 2014… England state-funde…     685843532     35710933  5.21
## 6 Autumn… NATI… 2014… England state-funde…    1589076637     72146803  4.54

To produce a nice plot ends up in quite a lot of code, so I will build up bit by bit.

This gives us our base plot

Government tends to like seeing zero on the y-axis, so lets fix the axes with expand_limits(), and add a title with ggtitle.

At this point I apply theme_gov(), and introduce a scale using colours from the gov.uk colour palette. For this we can call check_pal()

theme_gov() removes the legend by default, so I’ll label the lines instead. This gets a little complicated here as we need to nudge the values into the correct place using the hjust and vjust arguments. I also use the sprintf() command to force R to print a single decimal place, even if this number is zero - the default would be not to do this.

So this is pretty close to the final figure. One thing we might want to do is rotate the y-axis label so that it reads horizontally

Creating the second plot

Illness absence rates

Start with the full absence data. Filter to only NATIONAL values, then sum over years for the variables sess_overall, sess_possible, and sess_auth_illness. Then calculate the overall absence rate, and the illness absence rate, and finally gather this up into a long rather than a wide data.frame to allow easier plotting of colours

## # A tibble: 18 x 6
##    Year    sess_overall sess_possible sess_auth_illness key   value
##    <chr>          <dbl>         <dbl>             <dbl> <chr> <dbl>
##  1 2006/07    101688627    1579151686          56318795 oar    6.44
##  2 2007/08     92716911    1480357958          51614916 oar    6.26
##  3 2008/09     99518296    1576211246          58638736 oar    6.31
##  4 2009/10     91532020    1515697308          55355370 oar    6.04
##  5 2010/11     92722678    1603871560          56428397 oar    5.78
##  6 2011/12     76087568    1524001108          46140038 oar    4.99
##  7 2012/13     79741964    1509825224          50356903 oar    5.28
##  8 2013/14     71314855    1621608727          43602079 oar    4.40
##  9 2014/15     72146803    1589076637          46573697 oar    4.54
## 10 2006/07    101688627    1579151686          56318795 iar    3.57
## 11 2007/08     92716911    1480357958          51614916 iar    3.49
## 12 2008/09     99518296    1576211246          58638736 iar    3.72
## 13 2009/10     91532020    1515697308          55355370 iar    3.65
## 14 2010/11     92722678    1603871560          56428397 iar    3.52
## 15 2011/12     76087568    1524001108          46140038 iar    3.03
## 16 2012/13     79741964    1509825224          50356903 iar    3.34
## 17 2013/14     71314855    1621608727          43602079 iar    2.69
## 18 2014/15     72146803    1589076637          46573697 iar    2.93

Now for the plotting. Rather than approach it piece by piece, I include the full code here in a single chunk.

# Start with the new illness_summary object

illness_summary %>%

  # Set up the basics of the plot

  ggplot +
  aes(
    x = Year,
    y = value,
    group = key,
    colour = key
  ) +

  # Add the lines

  geom_path(size = 1.5) +

  # Add the values at the start and end of the lines

  geom_text(
    data = illness_summary %>% filter(Year %in% c("2006/07","2014/15")) %>% arrange(Year),

    # Force values to show one decimal place even if that is zero

    aes(label = sprintf("%.1f", value)),

    # Nudge the values away from the lines

    hjust = rep(c(1.25,-0.25),each = 2),
    fontface = "bold"
  ) +

  # Label the lines

  geom_text(
    data = illness_summary %>% filter(Year == "2006/07"),
    aes(label = c(
      "Overall absence rate",
      "Illness absence rate"
    )),

    # Left justify, and nudge the values up away from the lines

    hjust = 0,
    vjust = -1.2,
    size = 4,
    fontface = "bold"
  ) +

  # axis limits

  expand_limits(x = 0, y = c(0, 8)) +

  # Use the gov.uk colours

  scale_colour_manual(values = gov_cols[c("turquoise","brown")] %>% unname) +

  # Apply theme_gov

  theme_gov(
    base_size = 12, base_colour = "gray40", axes = "x"
  ) +

  # Label the axes

  xlab("Autumn and spring term") +
  ylab("Absence rate (%)") +

  # Add a title. Note that line breaks in the title must be specified manually
  # with "\n"

  ggtitle(
    "Comparison of the trend in overall and illness\n absence rates: England, autumn 2006 and\n spring 2007 to autumn 2014 and spring 2015"
  ) +

  # Make the y-axis title horizontal, and at the top of the axis.
  # Adjust margins to compensate for this.
  # Adjust the axis breakpoints.

  theme(
    axis.title.y = element_text(
      angle = 0, hjust = 20, vjust = 1.01
    ),
    plot.margin = grid::unit(c(0,5,5,0), "mm")
  ) +
  scale_y_continuous(breaks = c(0, seq(0, 8, 2)))