Here is a very quick way to visualize the growth of global agricultural GDP from 2000 to 2020.

We’ll use the ggplot2 library to generate a professional-looking chart with a clean and modern aesthetic.



# Create a data frame

 data <- data.frame( Year = seq(2000, 2020, by = 1), GDP = c(3.4, 3.3, 3.2, 3.2, 3.3, 3.4, 3.5, 3.6, 3.7, 3.8, 3.9, 4.0, 4.1, 4.2, 4.2, 4.1, 4.0, 3.9, 4.0, 4.1, 4.3) )



# Load necessary libraries

library(ggplot2) 
library(scales)



Create the plot


ggplot(data, aes(x = Year, y = GDP)) +
  geom_line(color = "darkgreen", size = 1) +
  geom_point(color = "darkgreen", size = 3) +
  geom_area(fill = "lightgreen", alpha = 0.5) +
  scale_y_continuous(labels = percent_format(scale = 1), limits = c(3.0, 4.4), breaks = seq(3.0, 4.4, by = 0.2)) +
  labs(title = "Agriculture Global GDP", subtitle = "(Gross Domestic Product)", x = NULL, y = NULL) +
  theme_minimal() +
  theme(
    plot.title = element_text(size = 20, face = "bold"),
    plot.subtitle = element_text(size = 12, face = "italic"),
    axis.text = element_text(size = 12),
    panel.grid.major = element_line(color = "grey80"),
    panel.grid.minor = element_blank()
  ) +
  annotate("text", x = 2000, y = 3.4, label = "3.4%", vjust = -1, color = "darkgreen", size = 5, fontface = "bold", fill = "darkgreen", bg.color = "white") +
  annotate("text", x = 2020, y = 4.3, label = "4.3%", vjust = -1, color = "darkgreen", size = 5, fontface = "bold", fill = "darkgreen", bg.color = "white")



As we can see, in 2000, the agriculture sector made up 3.4% of the world’s GDP. This means that out of all the goods and services produced globally, 3.4% came from agriculture.

Over the next 20 years, the role of agriculture in the global economy grew steadily.

By 2020, agriculture’s contribution had risen to 4.3%. This indicates a positive trend and suggests that agriculture became more important to the global economy during this period.

The data suggests that agriculture remains a vital part of the global economy and continues to grow in importance.