The coronavirus (Covid-19) outbreaks that led to a serious health crisis has brought major disruptions on the economy in many countries, including Indonesia. Firstly identified in early March 2020, the pandemic has started to affect Indonesian economy in Q1-2020. Yet the situation is even worse in Q2-2020. How bad is that? This publication is intended to explore the economic impacts of Covid-19 pandemic across Indonesian provinces from Q1 to Q2-2020. Apart from Covid-19 cases and economic growth data, we also include jobs and community mobility data from Google to capture the impact of Covid-19 outbreaks on regional employment and people mobility.

Suggested Citation:

Harry, A. Cani, R.M, Mendez, C (2020). Covid-19 pandemic and its economic impacts: An interactive exploration on Indonesian provincial data. Available at https://rpubs.com/haginta/covid19-econ-impacts-indonesia.

This work is licensed under the Creative Commons Attribution-Share Alike 4.0 International License.

knitr::opts_chunk$set(
  echo = TRUE,
  message = FALSE,
  warning = FALSE
)
library(tidyverse)
## -- Attaching packages --------------------------------- tidyverse 1.3.0 --
## v ggplot2 3.3.0     v purrr   0.3.4
## v tibble  3.0.1     v dplyr   1.0.0
## v tidyr   1.1.0     v stringr 1.4.0
## v readr   1.3.1     v forcats 0.5.0
## Warning: package 'tidyr' was built under R version 4.0.2
## Warning: package 'dplyr' was built under R version 4.0.2
## -- Conflicts ------------------------------------ tidyverse_conflicts() --
## x dplyr::filter() masks stats::filter()
## x dplyr::lag()    masks stats::lag()
library(ExPanDaR)   
library(sf)         # Simple features for R
## Linking to GEOS 3.8.0, GDAL 3.0.4, PROJ 6.3.1
library(tmap)       # Thematic Maps
library(ggplot2)
library(tmaptools)
library(leaflet)

options(prompt="R> ", digits=3, scipen=999)

Load non-spatial data

library(readxl)
data <- read_excel("explore expandr.xlsx", 
    sheet = "Sheet1")
View(data)
df <- data %>% select(-c(4:7,9:12))

Load dataframe of definitions

library(readr)
df_definitions <- read_delim("df_def.csv", ";", escape_double = FALSE, 
    trim_ws = TRUE)
df_definitions

Load shape file of Indonesian provinces

map <- read_sf("province border.shp")

Merge non-spatial data with spatial data

covid_map <- inner_join(
  df,
  map,
  by = "ID"
)
covid_map

Store data as sf object

covid_map1 <- st_as_sf(covid_map)

How the number of cumulative cases changes from March to June 2020?

tmap_mode("plot")
tm_shape(covid_map1) +
  tm_polygons(c("case_chg", "rate_chg"), id = "province", palette=list("Reds", "Greens"), title=c("Change in number of cumulative cases (Mar to Jun)", "Change in rate of cumulative cases (Mar to Jun)")) +
tm_fill(style="kmeans") +
tm_layout(legend.title.size = 0.6,
          legend.text.size = 0.5,
          legend.position = c("left","bottom"))

How jobs and people mobility are affected?

tmap_mode("plot")
tm_shape(covid_map1) +
  tm_polygons(c("job_loss", "mob_work"), id = "province", palette=list("Blues", "Reds"), title=c("Number of jobs affected", "Mobility to work compared to baseline")) +
tm_fill(style="kmeans") +
  tm_layout(legend.title.size = 0.5,
          legend.text.size = 0.4,
          legend.position = c("left","bottom"))

How much is growth impact in Q2-2020 (yoy and qtq)?

tmap_mode("plot")
tm_shape(covid_map1) +
  tm_polygons(c("gdp_q2_yoy", "gdp_q2_qtq"), id = "province", palette=list("Reds", "Blues"), title=c("GDP growth Q2-2020 (yoy)", "GDP growth Q2-2020 (qtq)")) +
tm_fill(style="kmeans") +
  tm_layout(legend.title.size = 0.6,
          legend.text.size = 0.5,
          legend.position = c("left","bottom"))

Most of provinces recorded negative growth rate in Q2-2020. However, some provinces were able to maintain positive growth rate. They are West Papua and Papua (for yoy growth) and West Nusa Tenggara, East Nusa Tenggara, Papua, Central Sulawesi (for qtq growth).

Interactive exploration

For further interactive data exploration, please visit the link below:

https://haginta.shinyapps.io/Covid19_econ_impacts_reg_Indonesia/

References