Your boss knows that they will be asking her about how the implications of the electric vehicle (EV) market and policy choices on the demand for copper and cobalt.
Use the workflow developed in this chapter to import and tidy worksheet 2.3 EV from the dataset.
Load Relevant Libraries
library(dplyr)
Warning: package 'dplyr' was built under R version 4.2.3
Attaching package: 'dplyr'
The following objects are masked from 'package:stats':
filter, lag
The following objects are masked from 'package:base':
intersect, setdiff, setequal, union
library(tidyverse)
Warning: package 'tidyr' was built under R version 4.2.3
Warning: package 'readr' was built under R version 4.2.3
── Conflicts ────────────────────────────────────────── tidyverse_conflicts() ──
✖ dplyr::filter() masks stats::filter()
✖ dplyr::lag() masks stats::lag()
ℹ Use the conflicted package (<http://conflicted.r-lib.org/>) to force all conflicts to become errors
library(scales)
Warning: package 'scales' was built under R version 4.2.3
Attaching package: 'scales'
The following object is masked from 'package:purrr':
discard
The following object is masked from 'package:readr':
col_factor
clean_scenarios <- stacked_data[,c(1, 3:10)]colnames(clean_scenarios)[2] <-"Scenario"clean_scenarios[, 3:8] <-lapply(clean_scenarios[, 3:8], as.numeric)clean_scenarios_long <-pivot_longer(clean_scenarios, cols =3:8, names_to ="Year", values_to ="Value")# Attach Current Year To the LONG SCENARIOS DATASETall_clean_long <-rbind(clean_scenarios_long,current_year)head(all_clean_long)
Use the tidied dataset to come up with 5 compelling data visualizations that illustrate key actionable insights about how policy scenarios, and technological scenarios will impact demand for copper and cobalt.
Visualizations
Visualization I: BOXPLOT
ggplot(CoCo_long) +aes(x = Value, y = Situation, fill = Year) +geom_boxplot() +scale_fill_hue(direction =1) +labs(title ="Projected Demand for Critical Minerals (kt)",subtitle ="Comparative analysis across technological scenarios and years",x ="Projected Demand (kt)",y ="Technological Scenario",fill ="Year" ) +guides(fill =guide_legend(title.position ="left", title.hjust =0.5)) +theme_minimal() +theme(legend.position ="bottom", text =element_text(size =12), axis.title =element_text(size =14), plot.title =element_text(size =16, face ="bold"),plot.subtitle =element_text(size =11),strip.text.x =element_text(size =12) ) +facet_wrap(vars(Minerals), scales ="free_x", ncol =2)
Copper demand spans a broader range with significant increases projected in the future, indicating its critical role in technology advancements.
Cobalt’s demand, while lower than copper’s, shows variability across scenarios, suggesting sensitivity to specific technological trends.
The presence of outliers, especially in the later years, may reflect the increasing difficulty of making long-term projections due to the potential for unforeseen technological advancements or market changes.
The variability within scenarios for both minerals suggests there is uncertainty about how technology will evolve and how this will impact demand. For instance, if solid-state batteries are adopted faster, this could significantly change the demand landscape for cobalt and copper.
Visualization II: Line Plot for COBALT
ggplot(Cobalt_long) +aes(x = Year, y = Value, colour = Scenario) +geom_line() +scale_color_hue(direction =1, l =50) +labs(title ="Projected Demand for Cobalt Over Years",subtitle ="Analysis Across Different Technological Scenarios",x ="Year",y ="Projected Demand for Cobalt (kt)",colour ="IEA Climate Scenario" ) +guides(colour =guide_legend(override.aes =list(size =4))) +theme_minimal() +theme(legend.position ="right", legend.title.align =0.5,text =element_text(size =10),axis.title =element_text(size =10), plot.title =element_text(size =10, face ="bold"),plot.subtitle =element_text(size =8),strip.text =element_text(size =6), legend.text =element_text(size =8) ) +facet_wrap(vars(Situation), scales ="free_y", ncol =2)
Key Takeaways:
Across all scenarios, there is a clear upward trend in the demand for cobalt over the years, indicating an overall growth in the need for cobalt from 2020 to 2050.
The “Constrained nickel supply” scenario projects the highest demand for cobalt, peaking above 100 kt, suggesting that a nickel constraint could increase reliance on cobalt. Meanwhile, the “Lower battery sizes” and “Wider use of silicon-rich anodes” scenarios also show significant demand growth, though not as pronounced as the “Constrained nickel supply” scenario.
Under the “Announced pledges scenario” (green line), the demand trajectory is moderately increasing, while the “Net Zero Emissions by 2050 scenario” (blue line) shows the lowest growth, indicating that achieving net zero emissions could potentially involve reduced cobalt dependency.
The demand for cobalt varies widely across the scenarios, with the “Stated policies scenario” showing a demand ranging from approximately 25 kt to just over 250 kt, and the “Announced pledges scenario” and “Net Zero Emissions by 2050 scenario” showing a range from around 25 kt to 200 kt and 150 kt, respectively, by 2050.
Visualization III: Line Plot for Copper
ggplot(Copper_long) +aes(x = Year, y = Value, colour = Scenario) +geom_line() +scale_color_hue(direction =1, l =50) +labs(title ="Projected Demand for Copper Over Years",subtitle ="Analysis Across Different Technological Scenarios",x ="Year",y ="Projected Demand for Copper (kt)",colour ="IEA Climate Scenario" ) +guides(colour =guide_legend(override.aes =list(size =4))) +theme_minimal() +theme(legend.position ="right", legend.title.align =0.5,text =element_text(size =10),axis.title =element_text(size =10), plot.title =element_text(size =10, face ="bold"),plot.subtitle =element_text(size =8),strip.text =element_text(size =6), legend.text =element_text(size =8) ) +facet_wrap(vars(Situation), scales ="free_y", ncol =2)
Key Takeaways:
The demand for copper is expected to increase over time across all technological and policy scenarios.
Scenarios like “Constrained nickel supply” and “Wider use of silicon-rich anodes” predict a higher demand for copper, suggesting that these technologies may rely more heavily on copper.
Scenarios like “Lower battery sizes” and “Limited battery size reduction” show different growth rates, indicating that the size of batteries has a significant impact on copper demand.
We can see that Announced Pledges Scenario is trailing closely behind Net Zero Emissions by 2050 Scenario, with the two converging at 2050, while the STEPS scenario accounts for about a third of the NZE demand across all years.
base_colors <-c("Cobalt"="#0047ab", # Deep blue for Cobalt"Copper"="#b87333") # Reddish-brown for Copper# Plottingggplot(combined_growth, aes(x = Year, y = Growth, color = Mineral, linetype = Scenario)) +geom_line() +scale_color_manual(values = base_colors) +labs(title ="Year-Over-Year Growth in Projected Demand for Cobalt and Copper",x ="Year",y ="Growth (%)",color ="Mineral",linetype ="Scenario") +theme_minimal() +theme(legend.position ="bottom") +facet_wrap(~ Situation, scales ="free_y", ncol =3) +guides(color =guide_legend(nrow =2, byrow =TRUE),linetype =guide_legend(nrow =3, byrow =TRUE))
Key Takeaways:
Both Cobalt and Copper experience a sharp increase in growth rate around 2025, followed by a significant decline. This suggests that there may be a technological or market development around that time driving a surge in demand, which then stabilizes or decreases as the market becomes saturated or as alternative technologies emerge.
The various scenarios depicted—such as “Constrained nickel supply,” “Faster uptake of solid-state batteries,” and “Wider use of silicon-rich anodes”—each have a distinct impact on the demand growth rate for both minerals. The scenarios likely represent different technological or policy developments, each altering the projected demand trajectory for Cobalt and Copper.
The trends for Cobalt and Copper diverge under certain scenarios, indicating that the two minerals may not be equally impacted by the same market or technological changes. For example, in the scenario “Limited battery size reduction,” the demand for Cobalt seems to decline sharply after 2025, while Copper demand growth experiences a less dramatic decrease.
The “Net Zero Emissions by 2050 scenario” and “Stated policies scenario” lines suggest that policy initiatives have a substantial effect on the demand for these minerals. The steeper decline in growth rate under the “Net Zero Emissions by 2050 scenario” could reflect a transition to technologies that are less reliant on these minerals, or more efficient in their use.
Visualization V: Net Zero Emissions by 2050 Scenario Breakdown
CoCo_NZE <- CoCo_long %>%filter(Scenario =="Net Zero Emissions by 2050 scenario")ggplot(CoCo_NZE, aes(x = Year, y = Value, fill = Situation)) +geom_bar(stat ="identity", position ="dodge") +labs(title ="Annual Values of Cobalt and Copper in the Net Zero Emissions by 2050 Scenario",x ="Year",y ="Projected Demand (in kt)",fill ="Technological Situation") +facet_wrap(~ Minerals) +theme_minimal() +theme(legend.position ="bottom") +guides(fill =guide_legend(ncol =2)) +theme(plot.title =element_text(hjust =0.5)) # Center the plot title
Key Takeaways:
The projected demand for both Cobalt and Copper experiences rapid growth until around 2030, after which the rate of increase appears to stabilize or slow down, particularly for Cobalt.
While both minerals show growth in demand, Copper demand is significantly higher than Cobalt in the later years, especially noticeable after 2040 in the “Net Zero Emissions by 2050 Scenario”.
Different technological situations lead to varying demand projections, with some situations like “Constrained nickel supply” and “Faster uptake of solid-state batteries” resulting in higher projected demand for both minerals.
The “Constrained nickel supply” and “Faster uptake of solid state batteries” situations have the most significant impact on increasing demand, suggesting these factors are key drivers in the market for these minerals.