Example: Analysis of Emissions-Reduction Policy

Jonathan Gilligan

2019-07-31

U.S. Nationally Defined Contribution to Paris Accord

The United States’s Nationally Determined Contribution (NDC) to the 2015 Paris climate accord committed to reducing greenhouse gas emissions to 26–28% below 2005 levels by 2025 and with a longer-term target of reducing emissions to 80% below 2005 levels by 2050 (United States of America 2015).1 This vignette will compare what these goals imply for rates of improving energy efficiency and transitioning from fossil fuels to clean energy sources. The methods will follow Roger Pielke, Jr.’s approach for both bottom-up and top-down analysis (Pielke 2009b, 2009a, 2010, 2011).

Bottom-Up Analysis

Pielke’s analysis rely on the Kaya identity: \[ F = P \times g \times e \times f, \] where

Pielke begins his bottom-up analysis by examining projections of future population and per-capita GDP. In this vignette, I develop those projections not from demographic and economic models, but simply by extrapolating from recent trends.

Implied Decarbonization Rates

Next, calculate the implied rate of change of F under the policy. This is not an extrapolation from history, but a pure implication of the policy goals: From the Kaya identity, \(F = G \times e \times f\), so the rates of change are \(r_F = r_G + r_e + r_f = r_G + r_{ef}\).

ref_year <- 2005
target_years <- c(2025, 2050)
target_reduction <- c(0.26, 0.80)

F_ref <- kaya %>% filter(year == ref_year) %$% F
F_target <- tibble(year = target_years, F = F_ref * (1 - target_reduction)) %>%
  mutate(implied_rate = log(F / F_ref) / (year - ref_year))

F_target %>% 
  mutate(implied_rate = map_chr(implied_rate, ~percent(.x,  0.01))) %>%
  rename("Target F" = F, "Implied Rate" = implied_rate) %>%
  kable(align = c("crr"), digits = 0)
year Target F Implied Rate
2025 4346 -1.51%
2050 1175 -3.58%

For the bottom-up analysis of decarbonization, I will use \(r_{ef}\), the implied rate of decarbonization of the economy, conditional on future economic growth following the historical trend. This is expressed in the equation \(r_{ef} = r_F - r_G\), where \(r_F\) is the rate of emissions-reduction implied by the policy (see above) and \(r_G\) is the historical growth rate of GDP:

implied_decarb_rates <- F_target %>% 
  transmute(year, impl_F = implied_rate, 
            hist_G = historical_trends['P'] + historical_trends['g'],
            hist_ef = historical_trends['e'] + historical_trends['f'],
            impl_ef = impl_F - hist_G)

implied_decarb_rates %>% 
  mutate_at(vars(starts_with("hist_"), starts_with("impl_")),
            list(~map_chr(., ~percent(.x, 0.01)))) %>%
  select(Year = year, 
         "implied F" = impl_F, 
         "historical G" = hist_G,
         "implied ef" = impl_ef, 
         "historical ef" = hist_ef
  ) %>%
  kable(align="rrrrr")
Year implied F historical G implied ef historical ef
2025 -1.51% 2.34% -3.84% -3.20%
2050 -3.58% 2.34% -5.91% -3.20%

Results

To meet the goals for 2025 would require increasing the rate of reducing ef from -3.20% per year to -3.84% per year: 1.2 times faster.

To meet the goals for 2050 would require increasing the rate of reducing ef from -3.20% per year to -5.91% per year: 1.8 times faster.

Top-Down Analysis

The top-down analysis is very similar to the bottom-up analysis, but instead of looking at the elements of the Kaya identity individually, we use predictions from macroeconomic integrated assessment models that consider interactions between population, GDP, and energy use to predict future energy demand:

top_down_trends <- get_top_down_trends("United States")

top_down_trends %>% select(P, G, E) %>%
  mutate_all(list(~map_chr(., ~percent(.x, 0.01)))) %>%
  rename("P trend" = P, "G trend" = G, "E trend" = E) %>%
  kable(align="rrr")
P trend G trend E trend
0.50% 1.90% 0.20%

Implied Decarbonization

In the bottom-up analysis, we calculated the implied rate of decarbonizing the economy by comparing the rate of emissions reduction implied by the policy (\(r_F\)) to the predicted rate of change of GDP (\(r_G\)). Here, in the top-down analysis, we calculate the implied rate of decarbonizing the energy supply (\(r_f\)) by comparing the rate of emissions-reduction implied by policy (\(r_F\)) to the predicted rate of growth of energy demand (\(r_E\)): \(F = E \times f\), so \(r_F = r_E + r_f\), which we rearrange to find that \(r_f = r_F - r_E\).

implied_decarb_rates_top_down <- F_target %>% 
  transmute(year, impl_F = implied_rate, 
            top_down_E = top_down_trends$E,
            hist_f = historical_trends['f'],
            impl_f = impl_F - top_down_E)

implied_decarb_rates_top_down %>% 
  mutate_at(vars(starts_with("hist_"), starts_with("impl_"), 
                 starts_with("top_down")),
            list(~map_chr(., ~percent(.x, 0.01)))) %>%
  select(Year = year, 
         "implied F" = impl_F, 
         "top-down E" = top_down_E,
         "implied f" = impl_f, 
         "historical f" = hist_f
  ) %>%
  kable(align="rrrrr")
Year implied F top-down E implied f historical f
2025 -1.51% 0.20% -1.71% -1.18%
2050 -3.58% 0.20% -3.78% -1.18%

Results

To meet the goals for 2025 would require increasing the rate of reducing f from -1.18% per year to -1.71% per year: 1.4 times faster.

To meet the goals for 2050 would require increasing the rate of reducing f from -1.18% per year to -3.78% per year: 3.2 times faster.

References

Pielke, Roger A., Jr. 2009a. Mamizu Climate Policy: An Evaluation of Japanese Carbon Emissions Reduction Targets.” Environmental Research Letters 4(4): 044001.
———. 2009b. The British Climate Change Act: A Critical Evaluation and Proposed Alternative Approach.” Environmental Research Letters 4(2): 024010.
———. 2010. The Climate Fix: What Scientists and Politicians Won’t Tell You about Global Warming. Basic Books.
———. 2011. An Evaluation of the Targets and Timetables of Proposed Australian Emissions Reduction Policies.” Environmental Science & Policy 14(1): 20–27.
United States of America. 2015. U.S. Cover Note, INDC, and Accompanying Information. https://www4.unfccc.int/sites/submissions/INDC/Published%20Documents/United%20States%20of%20America/1/U.S.%20Cover%20Note%20INDC%20and%20Accompanying%20Information.pdf.

  1. The Trump administration has announced its intention to withdraw from the Paris accord. The analysis in this vignette does not address that development and simply presents the implications of the pledged contribution.↩︎

  2. A quad is short for a quadrillion British Thermal Units.↩︎