# import data
billionaire_gdp_indus_usa <- read.csv("../data/billionaire_gdp_indus_usa.csv")
billionaire_gdp <- read.csv("../data/billionaire_gdp.csv")
gdp <- read.csv("../data/gdp.csv")

Global Billionaires’ Wealth Trends Analysis

We conduct some exploratory analysis from two main aspects:

  • Billionaire Economic Trends:

    • GDP Trends: Analysis of changes in GDPs of 5 countries home to global billionaires, highlighting growth rates and economic development stages.

    • Sectoral Wealth Growth: Examination of the wealth growth within industries dominated by billionaires, noting the rise of new economic powerhouses.

    • Millionaire Residency Wealth Analysis: Tracking the net worth trends in Millionaire Residency with the highest concentration of billionaires, identifying urban patterns of wealth accumulation.

  • Billionaire Wealth Distribution

    • Global Net Worth Trends: Observation of the global net worth changes of billionaires, highlighting significant fluctuations due to global economic conditions.

    • Region Wealth Comparison: Analysis of the combined net worth of billionaires in the top five regions, reflecting the economic health and wealth generation in these nations.

    • Gender Wealth Gap: Examination of the distribution and total net worth of billionaires by gender, underscoring the persistent gender gap in billionaire wealth.

    • Self-Made Billionaires: Tracking the rise of self-made billionaires over the years, indicating the evolving landscape of entrepreneurial success and self-made wealth.

Billionaire Wealth Distribution

This category focuses on the distribution of wealth among different groups, genders, and the rise of self-made billionaires.

Region Wealth Comparison

data_filtered <- billionaire_gdp %>%
  filter(year >= 2010 & year <= 2023)

# group by region_code net worth over time 
total_net_worth_by_region <- data_filtered %>%
  group_by(region_code) %>%
  summarise(total_net_worth = sum(net_worth, na.rm = TRUE))

# net worth top 5 regions
top_regions <- total_net_worth_by_region %>%
  top_n(5, total_net_worth) %>%
  pull(region_code)

top_regions_data <- data_filtered %>%
  filter(region_code %in% top_regions)

total_net_worth_by_year_region <- top_regions_data %>%
  group_by(year, region_code) %>%
  summarise(total_net_worth = sum(net_worth, na.rm = TRUE))

# plot
tnw_citizen =
  ggplot(total_net_worth_by_year_region, aes(x = year, y = total_net_worth, color = region_code)) +
  geom_line(size = 1.2) +
  theme_minimal() +
  labs(title = "Total net worth of billionaires by top 5 regions from 2010 to 2023",
       x = "Year", y = "Total net worth (billions)",
       color = "Region code")+
  scale_x_continuous(breaks = 2010:2023)+
  theme(plot.title = element_text(hjust = 0.5),
        text = element_text(family = "Helvetica"))

ggplotly(tnw_citizen)

The chart comparing billionaires’ net worth from 2010 to 2023 in five key regions shows the USA’s significant growth, particularly after 2015. China demonstrates rapid, albeit fluctuating, wealth accumulation. Germany exhibits consistent growth, while India’s rise mirrors its economic development. Hong Kong, however, saw growth followed by a decline after 2019. This data reflects diverse economic trends and the influence of regional and global factors on wealth.

Gender Wealth Gap

# scale it to 1 to analyze the proportions
bil_gender_prop <-
  billionaire_gdp|> 
  drop_na(gender) |> 
  group_by(year, gender) |> 
  summarize(n = n()) |> 
  group_by(year) |> 
  mutate(total = sum(n),
         prop = n/ total)

bil_gender = 
  bil_gender_prop |> 
  ggplot(aes(x = year, y = prop, fill = gender))+
  geom_bar(position="stack", stat="identity") +
  labs(title = "Proportion of billionaires by gender from 2010 to 2023",
       x = "Year", y = "Proportion", fill = "Gender")+
  scale_x_continuous(breaks = 2010:2023)+
  theme(plot.title = element_text(hjust = 0.5),
        text = element_text(family = "Helvetica"))

ggplotly(bil_gender)

The bar chart illustrates the proportion of male and female billionaires from 2010 to 2023, indicating a consistent predominance of males in each year, with females representing a very small fraction of the total. This disparity in representation may reflect long-standing gender imbalances in wealth accumulation and opportunities for economic advancement.

billionaires_filtered <- billionaire_gdp %>%
  filter(year >= 2010 & year <= 2023) %>%  na.omit()

total_net_worth_by_year_gender <- billionaires_filtered %>%
  group_by(year, gender) %>%
  summarise(total_net_worth = sum(net_worth, na.rm = TRUE))


tnw_gender = 
  ggplot(total_net_worth_by_year_gender, aes(x = year, y = total_net_worth, color = gender)) +
  geom_line(size = 1.2) +
  theme_minimal() +
  labs(title = "Total net worth by gender from 2010 to 2023",
       x = "Year", y = "Total net worth (billions)", color = "Gender")+
  scale_x_continuous(breaks = 2010:2023)+
  theme(plot.title = element_text(hjust = 0.5),
        text = element_text(family = "Helvetica"))

ggplotly(tnw_gender)

The second line graph shows the net worth by gender from 2010 to 2023. The net worth of male billionaires is significantly higher than that of females throughout the period, with a particularly steep increase for males after 2015. The consistent gap and the sharp rise in male net worth could be due to a combination of factors, including the compounding effect of existing wealth, gender disparities in key industries, and potentially more males being active in high-growth sectors such as technology and finance.

Self-Made Billionaires

# scale it to 1 to analyze the proportions
bil_selfmade_prop <-
  billionaire_gdp|> 
  filter(year > 2010) |> 
  drop_na(self_made) |> 
  group_by(year, self_made) |> 
  summarize(n = n()) |> 
  group_by(year) |> 
  mutate(total = sum(n),
         prop = n/ total)

bil_selfmade = 
  bil_selfmade_prop |> 
  ggplot(aes(x = year, y = prop, fill = self_made)) +
  geom_bar(position="stack", stat="identity") +
  labs(title = "Proportion of self-made status count from 2011 to 2023",
       x = "Year", y = "Proportion", fill = "Self-made")+
  theme(plot.title = element_text(hjust = 0.5))+
  scale_x_continuous(breaks = 2011:2023)

ggplotly(bil_selfmade)

Note: Remove data for the year 2010 due to errors

The bar chart depicting the proportion of self-made billionaires from 2011 to 2023 demonstrates a consistent majority of individuals who have amassed their wealth independently, without inheritance or existing family wealth.