8  Development of crime in population

NSC-R Tidy Tuesday May 2022

Author

Wim Bernasco

Published

May 22, 2022

8.1 Introduction

Below you find the materials Wim Bernasco prepared for the Tidy Tuesday workshop on May 24th 2022. Here is the original link to this workshop and the materials. You find links to two small datasets. One (crime.csv) contains the number of police recorded residential burglaries, bike thefts and assaults in the Netherlands per month between January 2012 and April 2022. The other (population.csv) contains the number of inhabitants of the Netherlands during the same period, per first day of the month. In the workshop he tried to make sense of long-term temporal trends in these crimes, and hopefully also make useful statements about how things changed when the COVID pandemic arrived around February 2020. He worked out eight steps in the analysis (Bernasco, 2022).

Acknowledgement: Franziska Yasrebi-de Kom corrected errors and provided fruitfull suggestions for improvement of the first draft.

8.2 Start-up

Create a new folder on the computer where you run R, and store the two datafiles crime.csv and residents.csv in the folder.

You will normally load libraries here at the top of your script, but in this example I will load libraries at the point where I need their functionality. This shows when and why they are needed.

If your project is reasonably small and all files (data, scripts, and output files) can be stored in a single folder without creating confusion, setting a working folder is a good idea. All reading from and writing to disk will be done from and to this folder.

setwd("X:/YYY/ZZZ") # for example: setwd("C:/Users/bernasco/crime_trends_NL")

Note: In this script I will use the new |> piping symbol. It is equivalent to %>% but has two advantages, which are
- (1) it is shorter (2 instead of 3 symbols), and
- (2) it does not require you to load a library, as it has been built into base R

8.3 Read both files from disk and assign each a name.

Any name will do, but I suggest “crime” and ” residents”. Read data using the read_csv function in package readr. read_csv has a few advantages over read.csv but the latter will also do.

read_csv is in the readr library, so we load readr first. I added tidyverse also already.

library(readr)     # read_csv function
library(tidyverse)

Note: in the live workshop we stumbled upon an error caused by our assumption that “crimes.csv” and “population.csv” had dates coded with dashes (like in “2022-05-24”) but my Excel version had written it with slashes (like in “2022/05/24”). Verify that after reading the files, their ‘date’ column has type ‘date’, not type ‘character’. You can use glimpse to verify this.

crimes <- read_csv("data/crimes.csv")

population <- read_csv("data/population.csv")

8.4 Explore data

Explore the structure of the files. How many rows (observations), how many columns (variables), what are the variable names? What are their types: Are they integers, characters, dates, factors, .? keys? First explore the crime data.How many observations and how many variables (rows and columns)?

crimes |> dim()        # dim(crimes)
[1] 372   3

For glimpse, slice-sample and count, we need library dplyr library(dplyr). Display the names and types of the variables, and show values for the first few observations column-wise. Note: verify that column date has type ‘date’

crimes |> glimpse()
Rows: 372
Columns: 3
$ date       <date> 2012-01-01, 2012-02-01, 2012-03-01, 2012-04-01, 2012-05-01~
$ frequency  <dbl> 9787, 8237, 7944, 5955, 6198, 5493, 6168, 6481, 6102, 8178,~
$ crime_type <chr> "burglary", "burglary", "burglary", "burglary", "burglary",~

Show the first few cases row-wise

crimes |> head()
# A tibble: 6 x 3
  date       frequency crime_type
  <date>         <dbl> <chr>     
1 2012-01-01      9787 burglary  
2 2012-02-01      8237 burglary  
3 2012-03-01      7944 burglary  
4 2012-04-01      5955 burglary  
5 2012-05-01      6198 burglary  
6 2012-06-01      5493 burglary  

Show a random sample of 10 cases rather than the first ones. This will usually have more variation in values

crimes |> slice_sample(n=10) |> head()
# A tibble: 6 x 3
  date       frequency crime_type
  <date>         <dbl> <chr>     
1 2017-07-01      4052 assault   
2 2013-03-01      4206 assault   
3 2014-05-01      4811 burglary  
4 2015-11-01      3801 assault   
5 2018-12-01      5484 bike theft
6 2022-04-01      3416 assault   

Frequency table of crime types

crimes |> count(crime_type)
# A tibble: 3 x 2
  crime_type     n
  <chr>      <int>
1 assault      124
2 bike theft   124
3 burglary     124

You will see we have data for 124 months: 10 full years (2012-2021) + 4 months (Jan-April 2022)

Next explore the population data

population |> dim()
[1] 123   2

Note: verify that column date has type ‘date’.

population |> glimpse()
Rows: 123
Columns: 2
$ date       <date> 2012-01-01, 2012-02-01, 2012-03-01, 2012-04-01, 2012-05-01~
$ population <dbl> 16730348, 16731280, 16735690, 16737631, 16739764, 16742830,~
population |> head()
# A tibble: 6 x 2
  date       population
  <date>          <dbl>
1 2012-01-01   16730348
2 2012-02-01   16731280
3 2012-03-01   16735690
4 2012-04-01   16737631
5 2012-05-01   16739764
6 2012-06-01   16742830
population |> slice_sample(n=10) |> head()
# A tibble: 6 x 2
  date       population
  <date>          <dbl>
1 2018-05-01   17198900
2 2021-08-01   17515152
3 2018-04-01   17193102
4 2019-10-01   17385377
5 2013-10-01   16820076
6 2018-02-01   17185477

8.5 Visualize (plot) population and crime development

Visualize (plot) the development of the population size of the Netherlands between January 2012 and April 2022, and do the same for the frequencies of residential burglary, bike theft and assault.The ggplot function is in the ggplot2 library.

library(ggplot2)

Plot population as a scatterplot.

population |> 
    ggplot() + 
    geom_point(mapping = aes(x = date, y = population))

Population and crime development

  # or as a line graph
  population |> 
    ggplot() + 
    geom_line(mapping = aes(x = date, y = population))

Population and crime development

Keep it simple first. You can finetune later.Plot burglary frequencies

##| warning: false
#| echo: true
#| label: burglary_freq
#| fig-cap: "Burglary frequencies"
#| cap-location: margin
#| fig-width: 6
#| fig-height: 4
  crimes %>%
    filter(crime_type == "burglary") |>
    ggplot() + 
    geom_line(mapping = aes(x=date, y=frequency))

You should see a seasonal pattern with highs in Winter (nov-jan) and lows in summer. Plot bike theft

 crimes %>%
    filter(crime_type == "bike theft") |>
    ggplot() + 
    geom_line(mapping = aes(x = date, y = frequency)) 

Bike theft

You should also see a seasonal pattern, but with peaks in autumn (dep-nov)

Plot assault

crimes %>%
    filter(crime_type == "assault") |>
    ggplot() + 
    geom_line(mapping = aes(x = date, y = frequency))

Seasonal pattern

The seasonal pattern for assault shows peaks in spring (apr-jun). Plot the three crime types in a single graph and distinguish them by color.

crimes |>
    ggplot() + 
    geom_line(aes(x = date, y = frequency, color = crime_type)) 

Three crime types in one graph

Plot them in separate panels.

crimes |>
    ggplot() + 
    geom_line(aes(x = date, y = frequency)) +
    # scales = "free_y" allows each panel to have its own
    #  Y-axis scaling
    facet_wrap(facets = "crime_type", scales = "free_y", ncol = 1)

Types in seperated panels

I would not advise it, but you can combine panels and color (if you do, hide the legend to prevent redundancy)

crimes |>
    ggplot() + 
    geom_line(aes(x = date, y = frequency, color = crime_type)) +
    facet_wrap(facets = "crime_type", scales = "free_y", ncol = 1) +
    theme(legend.position="none")

8.6 Calculate corrected rate

Create a residential burglary rate by relating number of residential burglaries to the size of the population, and think about how you can adjust for different months having a different numbers of days (28-31). To do this, you will need to merge (join) the “crime” dataframe with the “residents” dataframe by year and month.

Merge crime and population by date (year and month).

 crime_population <- 
    # merge with crime type category labels
    left_join(crimes, population, by = "date")

To calculate the number of days in the month of a date, you can use the day_in_month function which is in the lubridate library. Divide monthly crime frequency by number of days in the month to obtain the daily crime frequency, and divide by 100,000 to obtain daily crime rates per 100,000 population.

Further, I multiply the result by mean days per month to obtain the MONTHLY crime rate, but this is arbitrary (daily, weekly, of annual rates would be fine as well)

  library(lubridate)
  crime_population_corrected <-
    crime_population |>
    mutate(
           # corrected for different month lengths
           rate = frequency / days_in_month(date) * 
             (365.25/12) / (population / 100000))

8.7 Visualize development of corrected crime rates

crime_population_corrected |>
    ggplot() + 
    geom_line(aes(x=date, y=rate, color=crime_type)) +
    facet_wrap(facets = "crime_type", scales="free_y", ncol=1)

Corrected crime rates

You got this warning:

#    Warning message:
#    Removed 3 row(s) containing missing values    

So where are these three missing values?

crime_population_corrected |>
    # select observations with NA (missing) values on 'rate'
    filter(is.na(rate))
# A tibble: 3 x 5
  date       frequency crime_type population  rate
  <date>         <dbl> <chr>           <dbl> <dbl>
1 2022-04-01      1645 burglary           NA    NA
2 2022-04-01      7096 bike theft         NA    NA
3 2022-04-01      3416 assault            NA    NA

Aha! The population data of April 2022 were not yet online! This means we have valid data on both crime and population Jan 2012 to March 2022.

8.8 Crime before and after covid

What can we say about the development of crime since February 2020, relative to the developments between 2012 and 2020? How can you quantify this with the data at hand?
Let’s look at burglary and start with making a plot that highlights the distinction between the periods before and during the pandemic.

First we create a new variable/column that contains an indicator for whether the month is a pandemic month or not.

Define the date the pandemic started (a single number of the type ‘date’)

covid_start <- as_date("2020-02-01")  

Note: The expression: date >= covid_start returns TRUE (1) for ‘covid_start’ and all later dates, and returns FALSE (0) for all dates before ‘covid_start’. The labels parameter assigns ‘before’ to 0 and ‘during’ to 1

crime_population_corrected_covid <-  
  crime_population_corrected |>
  mutate(covid = factor(date >= covid_start , 
                        labels=c("before", "during")))

We could just add a vertical line at the month that the pandemic started (February 2022)

crime_population_corrected_covid |>
    filter(crime_type == "burglary") |>
    ggplot() + 
    geom_line(aes(x=date, y=rate)) +
    # add a red vertical line at given point on X-axis
    geom_vline(xintercept = covid_start, color="red")

Crime during pandemic

Alternatively, we could create a two-category variable indicating the before-after distinction, and then plot by color

crime_population_corrected_covid |>
  filter(crime_type == "burglary") |>
  ggplot() + 
  geom_line(aes(x=date, y=rate, color=covid))

Before-after distinction

A combined graph for the three crime types

crime_population_corrected_covid |>
  ggplot() + 
  geom_line(aes(x=date, y=rate, color=covid)) +
  facet_wrap(facets = "crime_type", scales="free_y", ncol=1)

Three types combined

Note that there is a ‘hole’ in de line graphs between January 2020 and February 2020. This is because we are actually drawing two separate line graphs here, one ending Jan 2022 and one starting Feb 2022. When we create a line graph, we drawing an individual point graph and then connect consecutive points with lines. So there really is nothing between Jan 2020 and Feb 2020.

As we think of time as continuous (by day, or even hour), we may want to create a ‘before covid’ line that continues to Feb 2020.One way to do this is to explicitly draw two line graphs in the same plot. As you see this quickly becomes complicated ….

Note: I used “#F8766D” and “#00BFC4” to get the same colors that ggplot uses by default when there are two categories in a discrete variable

crime_population_corrected |>
  mutate(precovid_rate = if_else(date <= as_date("2020-02-01"),
                                 rate, as.numeric(NA)),
         postcovid_rate =if_else(date >= as_date("2020-02-01"),
                                 rate, as.numeric(NA))) |>
  ggplot() + 
  geom_line(aes(x=date, y=precovid_rate), color="#F8766D") +
  geom_line(aes(x=date, y=postcovid_rate), color="#00BFC4") +
  xlab("rate") +
  facet_wrap(facets = "crime_type", scales="free_y", ncol=1)  

Pre-covid rate

Now let us quantify the trends. We first calculate annual rates as we are presently not interested in the seasonal variations.

annual_rates_changes <-
  crime_population_corrected |>
  # create a variable indicating the year
  mutate(year = year(date)) |>
  # select only years 2012-2021 because we have not full 2022 data
  filter(year < 2022) |>
  # for each year and crime type, calculate annual crime rate
  group_by(year, crime_type) |>
  summarize(annual_rate = sum(rate)) |>
  # Now calculate relative change: 
  #   By what proportion does this year's rate differ
  #   from previous year's rate?
  # We do this for each crime type separately
  group_by(crime_type) |>
  # sort by year 
  arrange(year) |>
  # Copy last year's rate
  mutate(lag_annual_rate = lag(annual_rate)) |>
  # Relative change
  # See, e.g. https://www.youtube.com/watch?v=muAkepkjpZI
  mutate(annual_change = ((annual_rate - lag_annual_rate) / lag_annual_rate))

Just to check that what you did generates the intended result: lag_annual_rate(2015) == annual_rate(2014) lag_annual_rate(2014) == annual_rate(2013) lag_annual_rate(2013) == annual_rate(2012) lag_annual_rate(2012) == NA (because annual_rate(2011) is unknown)

annual_rates_changes |>
  filter(crime_type == "assault") |>
  head()
# A tibble: 6 x 5
# Groups:   crime_type [1]
   year crime_type annual_rate lag_annual_rate annual_change
  <dbl> <chr>            <dbl>           <dbl>         <dbl>
1  2012 assault           336.             NA        NA     
2  2013 assault           309.            336.       -0.0801
3  2014 assault           295.            309.       -0.0456
4  2015 assault           281.            295.       -0.0496
5  2016 assault           271.            281.       -0.0335
6  2017 assault           258.            271.       -0.0501

Plot relative changes

annual_rates_changes |>
  ggplot() +
  geom_line(aes(x=year, y=annual_rate, color=crime_type))

Relative changes

Define the covid years

covid_years <- c(2020, 2021)

Compare annual change before and during the pandemic per crime type

annual_rates_changes %>%
  mutate(covid = factor(year %in% covid_years, labels = c("before", "during"))) |>
  group_by(crime_type, covid) |>
  summarize(mean_change = mean(annual_change, na.rm=TRUE))
# A tibble: 6 x 3
# Groups:   crime_type [3]
  crime_type covid  mean_change
  <chr>      <fct>        <dbl>
1 assault    before     -0.0463
2 assault    during     -0.0799
3 bike theft before     -0.0587
4 bike theft during     -0.0718
5 burglary   before     -0.116 
6 burglary   during     -0.233 

8.9 Do anything else with the data that you find fun or seems

To make senseYou can see that there is an overall decline for each crime type (mean_change is always negative) and the decline is more pronounced (mean_change is more negative) during the pandemic than before the pandemic, in particular for assault and burglary.

For more rigorous statistical tests, we would need to dive into time series analysis.

8.10 References

Bernasco, W. (2022, May). NSC-R Workshops: NSC-R Tidy Tuesday. NSCR. Retrieved from https://nscrweb.netlify.app/posts/2022-05-24-nsc-r-tidy-tuesday/