# Inctest = HHINCOME *0.95
#
# Single_earner_1 = INCTOT >= INCTEST
# single_earner_2 = any(Single_earner_1)
# new_df <- lville_2019 %>%
# mutate(
#
# earner_var = if_else(HHINCOME <= (0.95*INCTOT) , "single_earner", "multi_earner")
# )
#
#
# earner_var = case_when(
# HHINCOME == 0 ~ 'no_earnings',
# INCTOT >= 0.65 * HHINCOME ~ "single_earner",
# TRUE ~ "multi_earner"
# )
# )
# earner_type = case_when(
# HHINCOME == 0 ~ 'no_earnings',
# any(INCTOT >= 0.90 * HHINCOME) ~ 'single_earner',
# TRUE ~ 'multi_earner'
load("clean_svybydemog_data.RData")
Access to safe and affordable housing is foundational for families’ well-being. In this report, we examine the intersection between gender and housing. We find that while in Louisville, women and men have similar rates of homeowership, women are far more likely to live in housing that is not affordable to them. This is exacerbated for women from a single-income home, women with children, and women of color. Disproportionate cost of living burdens and care-taking responsibilities can perpetuate a viscous cycle of inequity. Understanding the true size of the ‘equity gap’ can help inform policy decisions to stop this cycle from continuing.
The fact that a household falls under the single-earner category reflects their financial situation rather than the personal relationships of the people within the household. Single-earner households might include someone living on their own or living with children, or they might have a spouse or partner who is not working or who lives outside the household.
We’ll look at how homeownership and affordability shake out among Louisville residents. We’ll represent the 315,000 households as 100 dots.
Through the rest of this report, we’ll look at how these things combine to affect homeownership and housing affordability.
# Single Earner Vs. Multiple Earner Women
t_df <- census_microdata081122 %>%
filter(sex == "female")
prop.table(table(t_df$earner_type_d))
#single earner vs multi earner who women who happen to be head of household
#should we remove head of household filter?
occupation_micro <- census_microdata081122_person %>%
mutate(OCC = str_pad(OCC, 4, "left", "0") )
data.frame(
OCC = c("Management, Business, Science, and Arts")
occupation = c()
)
industry_earnings <- glpdata::industry_gender_earnings
industry_earnings_21 <- industry_earnings %>%
filter(
FIPS == "21111",
year == 2021,
ind_level == 2) %>%
mutate(label = if_else(label == "Administrative and Support and Waste Management and Remediation Services",
"Administrative and Waste Services",
label))
industry_label_order <- industry_earnings_21 %>%
filter(sex == "total") %>%
arrange(wages) %>%
pull(label)
industry_earnings_21 %<>%
mutate(label = factor(label, levels = industry_label_order, ordered = TRUE))
ggplot(industry_earnings_21, aes(x = wages, y = label)) +
geom_line(aes(group = label)) +
geom_point(aes(color = sex), size = 3) +
scale_color_manual(values = c("#f58021", "#00a9b7", "#0E4A99"),
labels = c("Female", "Male", "Total")) +
glp_graph_theme +
labs(title = "Wages by Industry and Gender") +
xlab("Average Wage") +
theme(
axis.title.y = element_blank()) +
scale_x_continuous(labels = scales::dollar_format(suffix = "k", scale = 0.001))
industry_gender_pct <- industry_earnings_21 %>%
group_by(industry) %>%
mutate(pct_female = jobs[sex == "female"] / jobs[sex == "total"]) %>%
filter(sex == "total")
ggplot(industry_gender_pct, aes(x = pct_female, y = wages)) +
geom_point(aes(size = sqrt(jobs))) +
scale_size_continuous(range = c(5, 20)) +
geom_text_repel(label = industry_gender_pct$label,
point.padding = 30,
family = "Museo Sans",
size = 12) +
glp_graph_theme
# library(plotly)
#
# plot_ly()
#
#
# plot_ly(industry_gender_pct) %>%
# add_markers(x = ~`pct_female`, y = ~`wages`,
# text = industry_gender_pct$label,
# marker = list(color = '#d63631', size = 10),
# hoverinfo = 'text',
# visible = TRUE)
library(reactable)
industry_earnings_lou <- industry_earnings %>%
filter(
FIPS == "21111",
#ind_level %in% c("2", "3"),
year == 2021) %>%
select(sex, jobs, wages, industry, ind_level, label)
top_level <- industry_earnings_lou %>%
filter(sex == "total", ind_level == 2) %>%
select(industry, label)
more_levels <- data.frame(
industry = c("31", "32", "33", "44", "45", "48", "49"),
label = c(rep("Manufacturing", 3), rep("Retail Trade", 2), rep("Transportation and Warehousing", 2))
)
top_level %<>%
bind_rows(more_levels) %>%
rename(industry_1 = label)
industry_earnings_lou %<>%
mutate(industry_join = str_sub(industry, 1, 2)) %>%
left_join(top_level, by = c("industry_join" = "industry"))
industry_earnings_lou %<>%
select(ind_level, label, industry_1, sex, jobs, wages) %>%
pivot_wider(names_from = sex, values_from = jobs:wages) %>%
mutate(pct_female = jobs_female / jobs_total,
pay_gap = wages_male - wages_female) %>%
select(ind_level, label, industry_1,
jobs_total, jobs_female, jobs_male, pct_female,
wages_total, wages_female, wages_male, pay_gap)
industry_earnings_lou %<>%
filter(label != "Textile Mills")
library(reactable)
reactable(
filter(industry_earnings_lou, ind_level == "2"),
searchable = TRUE,
showSortable = TRUE,
columns = list(
label = colDef(name = "Industry"),
jobs_total = colDef(name = "Total", format = colFormat(digits = 0, separators = TRUE)),
jobs_female = colDef(name = "Female", format = colFormat(digits = 0, separators = TRUE)),
jobs_male = colDef(name = "Male", format = colFormat(digits = 0, separators = TRUE)),
pct_female = colDef(name = "Percent Female", format = colFormat(percent = TRUE, digits = 0)),
wages_total = colDef(name = "Total", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
wages_male = colDef(name = "Male", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
wages_female = colDef(name = "Female", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
pay_gap = colDef(name = "Pay Gap", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
ind_level = colDef(show = FALSE),
industry_1 = colDef(show = FALSE)
),
columnGroups = list(
colGroup(name = "Jobs", columns = c("jobs_total", "jobs_female", "jobs_male", "pct_female")),
colGroup(name = "Wages", columns = c("wages_total", "wages_female", "wages_male", "pay_gap"))
),
defaultSorted = list("jobs_total" = "desc"),
theme = reactableTheme(style = list(fontFamly = "Arial")),
details = function(index) {
jobs_data <- industry_earnings_lou[industry_earnings_lou$industry_1 == top_level$industry_1[index], ]
jobs_data = jobs_data[jobs_data$ind_level == "3",]
if(nrow(jobs_data) == 1) {return(NULL)}
htmltools::div(style = "padding: 1rem",
reactable(jobs_data,
outlined = TRUE,
columns = list(
label = colDef(name = "Industry"),
jobs_total = colDef(name = "Total", format = colFormat(digits = 0, separators = TRUE)),
jobs_female = colDef(name = "Female", format = colFormat(digits = 0, separators = TRUE)),
jobs_male = colDef(name = "Male", format = colFormat(digits = 0, separators = TRUE)),
pct_female = colDef(name = "Percent Female", format = colFormat(percent = TRUE, digits = 0)),
wages_total = colDef(name = "Total", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
wages_male = colDef(name = "Male", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
wages_female = colDef(name = "Female", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
pay_gap = colDef(name = "Pay Gap", format = colFormat(digits = 0, separators = TRUE, prefix = "$")),
ind_level = colDef(show = FALSE),
industry_1 = colDef(show = FALSE)
),
columnGroups = list(
colGroup(name = "Jobs", columns = c("jobs_total", "jobs_female", "jobs_male", "pct_female")),
colGroup(name = "Wages", columns = c("wages_total", "wages_female", "wages_male", "pay_gap"))
),
defaultSorted = list("jobs_total" = "desc"))
)
}
)
sf_ind_2019_plot <- ggplot(sf_ind_2019,
aes(x=sex,
y=rate,
fill = description_broad)) +
geom_bar(stat="identity", position = "fill") +
geom_text(aes(y = rate, label = percent(rate, scale = 1, accuracy = 0.1)),
position = position_fill(vjust = 0.5), size = 24,
color = "white")
sf_ind_2019_plot
Income disparities by gender are significant in Louisville. In 2019, 50% of males in Louisville made at least $45,000 while this values is only $30,000 for females. This disparity increases as wages rise, wealthiest 10% of males earn at least $120,000 while females in the same income bracket earn at least $71,000.
#fix formatting
single_earner_pctiles <- lville_2019 %>%
group_by(sex) %>%
summarize(
ten_pct = Hmisc::wtd.quantile(HHINCOME, HHWT, probs = 0.1),
twenty_five_pct = Hmisc::wtd.quantile(HHINCOME, HHWT, probs = 0.25),
fifty_pct = Hmisc::wtd.quantile(HHINCOME, HHWT, probs = 0.5),
seventy_five_pct = Hmisc::wtd.quantile(HHINCOME, HHWT, probs = 0.75),
ninety_pct = Hmisc::wtd.quantile(HHINCOME, HHWT, probs = 0.9))
library(gt)
gt(single_earner_pctiles) %>%
tab_header(title = "Income Percentiles by Sex",
subtitle = "") %>%
fmt_currency(columns = vars(ten_pct, twenty_five_pct, fifty_pct, seventy_five_pct,
ninety_pct),
use_subunits = F) %>%
cols_label(ten_pct = "10th",
twenty_five_pct = "25th",
fifty_pct = "Median",
seventy_five_pct = "75th",
ninety_pct = "90th") %>%
cols_align(align = "center") %>%
tab_source_note(
source_note = md("Source: ACS microdata from IPUMS-USA")) %>%
opt_row_striping(row_striping = TRUE) %>%
opt_table_outline() %>%
tab_options(
table.font.size = px(12),
table.width = pct(50)) %>%
tab_style(
cell_text(
font = "Montserrat",
weight = "bold"),
cells_row_groups())
The chart below shows the number of single-earners than fall into each income bucket by gender. For example, the leftmost bar shows that around 4,000 single-earner, female-headed households earned between $0 and $10,000 in 2019, while the bottom chart shows that around 2,500 single-earner, male-headed households earned between $0 and $10,000 in 2019.
Single-earner, female-headed households make significantly less than their male counterparts. While the median household income for single female-headed households is $30,000, the median household income for single male-headed households is $45,000.
p <- lville_2019 %>%
filter(HHINCOME <= cut_95,
earner_type == "single_earner") %>%
func_plt_hist_overlay( "sex")
p <- p + glp_graph_theme
p <- p + labs(
title = "Income for Single-Earner Households",
) +
ylab(" ") +
guides(color = FALSE) +
facet_wrap(~sex, nrow = 2) +
theme(
#axis.ticks.x = element_line(size = 50000),
strip.text = element_blank()
) +
scale_x_continuous(
breaks = c(50000, 100000, 150000, 200000),
label = c("$50k", "$100k", "$150k", "$200k")
) +
scale_y_continuous(labels = scales::comma) +
scale_color_manual(values=c("#f58021", "#00a9b7"))+
scale_fill_manual(
values = c("#f58021", "#00a9b7"),
labels = c("Female", "Male"))
p
temp_df <- census_microdata081122 %>%
group_by(FIPS, year, earner_type_d) %>%
summarize(median_income = Hmisc::wtd.quantile(HHINCOME, HHWT, probs = 0.5),
.groups = "drop") %>%
COLA(median_income, rpp = FALSE)
temp_df %<>%
pivot_wider(values_from = "median_income", names_from = "earner_type_d")
trend(temp_df,
multiple_earner:single_fem_earner:single_male_earner,
pctiles = F,
plot_title = "Median Household Income by Earner Type",
cat = c("Multiple Earners" = "multiple_earner",
"Single Female Earner" = "single_fem_earner",
"Single Male Earner" = "single_male_earner"),
y_title = 'Dollars',
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
### Percent
temp_df <- lville_2019 %>%
filter(HHINCOME <= cut_95,
earner_type == "single_earner")
p_percent <- ggplot(temp_df, aes(x=HHINCOME,
y = (..count..)/sum(..count..),
fill=sex,
color = sex,
weight = HHWT)) +
geom_histogram(alpha=0.5, position = 'identity', binwidth = 10000) +
scale_fill_manual(values = c("#00A9B7", "#F58021")) +
scale_color_manual(values = c("#00A9B7", "#F58021")) +
labs(fill="") +
xlab("Household Income") +
ylab("Percentage")
p_percent <- p_percent + glp_graph_theme
p_percent <- p_percent + labs(
title = "Single Earner Income by Gender",
) +
ylab(" ") +
guides(color = FALSE) +
facet_wrap(~sex, nrow = 2) +
theme(
#axis.ticks.x = element_line(size = 50000),
strip.text = element_blank()
) +
scale_x_continuous(
breaks = c(50000, 100000, 150000, 200000),
label = c("$50k", "$100k", "$150k", "$200k")
) +
scale_y_continuous(labels=percent)
p_percent
As you would expect, households with multiple incomes have higher incomes than households with single incomes. However, the data also show a large disparity between female and male earnings over time. This gap is largest for working-age residents and less significant for those over age 60.
I_median_earn_age <- lville_2019 %>%
group_by(age_group, earner_type_d) %>%
summarize(Med=Hmisc::wtd.quantile(HHINCOME, weights = HHWT, probs = 0.5))
I_median_earn_age_plot <- ggplot(I_median_earn_age,
aes(x=age_group, y=Med, fill = earner_type_d)) +
geom_bar(stat="identity", position='dodge', alpha = 0.8)
I_median_earn_age_plot <- I_median_earn_age_plot + glp_graph_theme
I_median_earn_age_plot <- I_median_earn_age_plot +
labs(
title = "Household Income by Earner Type and Age",
) +
ylab("Household Income") +
xlab("Age Group") +
scale_y_continuous(labels = scales::dollar_format(suffix = "k", scale = 0.001)) +
scale_fill_manual(
values = c("#0E4A99", "#F58021", "#00A9B7"),
labels = c("Multiple Earner", "Single Female Earner", "Single Male Earner"))
I_median_earn_age_plot
Incomes for female single-earner households are much higher for white-headed households than households headed by women of another race. Income for Black- and Hispanic-headed households is very concentrated in the $10,000 to $30,000 range.
Only wages under $200,000 are displayed because of the small number of residensts earning over $200,000.
black_female_earner <- func_income_by_race("black")
black_female_earner
hisp_female_earner <- func_income_by_race("hispanic")
hisp_female_earner <- hisp_female_earner +
labs(
title = "Hispanic Female Single Earner Income",
) +
scale_fill_manual(values = "#0E4A99") +
scale_color_manual(values = "#0E4A99")
hisp_female_earner
white_female_earner <- func_income_by_race("white")
white_female_earner <- white_female_earner +
labs(
title = "White Female Single Earner Income",
) +
scale_fill_manual(values = "#F58021") +
scale_color_manual(values = "#F58021")
white_female_earner
other_female_earner <- func_income_by_race("other")
other_female_earner <- other_female_earner +
labs(
title = "Other Female Single Earner Income",
) +
scale_fill_manual(values = "#00A9B7") +
scale_color_manual(values = "#00A9B7")
other_female_earner
Data from the MIT living wage calculator show the amount of money required to meet a basic level of needs in mid-2021. For single-adult households in mid-2021, a living wage was $33k for a single adult with no children, $66k for an adult with one child, $84k for an adult with two children, and $112k for one adult and three children.
These graphs show incomes for female single-earner households broken down by the number of children in the household. The blue dotted line represents a living wage.
func_income_by_kids <- function(num_kids, living_wage) {
w <- census_microdata081122 %>%
filter(
FIPS == "21111",
year %in% 2016:2019,
sex == 'female',
NCHILD == num_kids,
earner_type == 'single_earner',
HHINCOME <= cut_95)
w <- w %>%
ggplot( aes(x=HHINCOME,
y = (..count..)/sum(..count..),
fill = sex,
group = sex,
weight = HHWT)) +
geom_histogram(alpha=0.5, position = 'identity', binwidth = 10000) +
geom_vline( aes(xintercept = living_wage), linetype = "dashed", colour="blue", size = 1.5) +
annotate("text", x=living_wage - 3500, y=0.3, size = 12, label=dollar(living_wage,
scale = 0.001,
accuracy = 0.1,
suffix = "k"),
angle=0,
family = "Museo Sans")
#sing_fem_inc_race_plt <- sing_fem_inc_race_plt + facet_wrap(~race, nrow = 2)
w <- w + glp_graph_theme
w <- w +
labs(
title = "Black Female Single Earner Income",
) +
ylab(" ") +
xlab("Household Income")+
guides(color = FALSE,
fill = FALSE)
w <- w +
theme(
#axis.ticks.x = element_line(size = 50000),
strip.text = element_blank()
) +
scale_x_continuous(
breaks = c(50000, 100000, 150000),
label = c("$50k", "$100k", "$150k"),
limits = c(0, 160000)
) +
scale_y_continuous(labels = scales::percent,
limits = c(0, 0.4))
return (w)
}
44% of single-earner, female-headed households with no children earned a living wage.
#why is color not working?
#still need to add living wage lines
under_liv_wage_0 <- census_microdata081122 %>%
filter(
FIPS == "21111",
year %in% 2019,
sex == 'female',
NCHILD == 0,
earner_type == 'single_earner') %>%
mutate(lw = HHINCOME < 33321.6) %>%
group_by(lw) %>%
summarize(count = sum(HHWT)) #a little more than half are earning a living wage
#do this for each graphof this type...add info above chunk
under_liv_wage_0_result <- under_liv_wage_0$count[under_liv_wage_0$lw] / sum(under_liv_wage_0$count)
no_kids_female_earner <- func_income_by_kids(0, 33321.6)
no_kids_female_earner <- no_kids_female_earner +
labs(
title = "Female Single-Earner Income, No Children",
) +
scale_fill_discrete(labels = "No Children")
no_kids_female_earner
24% of single-earner, female-headed households with one child earned a living wage.
under_liv_wage_1 <- census_microdata081122 %>%
filter(
FIPS == "21111",
year %in% 2019,
sex == 'female',
NCHILD == 1,
earner_type == 'single_earner') %>%
mutate(lw = HHINCOME < 66081.6) %>%
group_by(lw) %>%
summarize(count = sum(HHWT))
under_liv_wage_1_result <- under_liv_wage_1$count[under_liv_wage_1$lw] / sum(under_liv_wage_1$count)
one_child <- func_income_by_kids(1, 66081.6)
one_child <- one_child +
labs(
title = "Female Single-Earner Income, One Child",
) +
scale_fill_manual(values = "#800055", labels = "One Child" ) +
scale_color_manual(values = "#800055")
one_child
5% of single-earner, female-headed households with two children earned a living wage.
under_liv_wage_2 <- census_microdata081122 %>%
filter(
FIPS == "21111",
year %in% 2019,
sex == 'female',
NCHILD == 2,
earner_type == 'single_earner') %>%
mutate(lw = HHINCOME < 83990.4) %>%
group_by(lw) %>%
summarize(count = sum(HHWT))
under_liv_wage_2_result <- under_liv_wage_2$count[under_liv_wage_2$lw] / sum(under_liv_wage_2$count)
two_child <- func_income_by_kids(2, 83990.4)
two_child <- two_child +
labs(
title = "Female Single-Earner Income, Two Children",
) +
scale_fill_manual(values = "#356E39", labels = "Two Children") +
scale_color_manual(values = "#356E39")
two_child
2% of single-earner, female-headed households with three children earned a living wage.
under_liv_wage_3 <- census_microdata081122 %>%
filter(
FIPS == "21111",
year %in% 2019,
sex == 'female',
NCHILD == 3,
earner_type == 'single_earner') %>%
mutate(lw = HHINCOME < 111529.6) %>%
group_by(lw) %>%
summarize(count = sum(HHWT))
under_liv_wage_3_result <- under_liv_wage_3$count[under_liv_wage_3$lw] / sum(under_liv_wage_3$count)
under_liv_wage <- bind_rows(under_liv_wage_0, under_liv_wage_1) %>%
bind_rows(under_liv_wage_2) %>%
bind_rows(under_liv_wage_3)
under_lw_all <- sum(under_liv_wage$count[under_liv_wage$lw]) / sum(under_liv_wage$count)
three_child <- func_income_by_kids(3, 111529.6)
three_child <- three_child +
labs(
title = "Female Single-Earner Income, Three Children",
) +
scale_fill_manual(values = "#CFB94C", labels = "Three Children") +
scale_color_manual(values = "#CFB94C")
three_child
## Avg Age of Women:Living Wage
age_liv_wage <- function(num_kids, living_wage) {
df <- census_microdata081122 %>%
filter(
FIPS == "21111",
year %in% 2016:2019,
sex == 'female',
NCHILD == num_kids,
earner_type == 'single_earner',
HHINCOME < living_wage) %>%
#group_by(HHINCOME < living_wage) %>%
summarize(Hmisc::wtd.mean(age, HHWT, na.rm=TRUE))
return(df)
}
# three_child <- func_income_by_kids(3, 101452.61)
under_liv_wage_0_age <- age_liv_wage(0, 30303.98) #61.2
under_liv_wage_1_age <- age_liv_wage(1, 60264.75) #38.9
under_liv_wage_2_age <- age_liv_wage(2, 76451.81) #34.9
under_liv_wage_3_age <- age_liv_wage(3, 101452.61) #32.7
Cost-burden is the percent of income that a household pays towards housing costs, including rent, utilities, mortgage payments, and other homeownership expenses like property taxes. Housing is commonly considered “affordable” if it costs less than 30% of the households income. This measure is limited because low-income households might pay a small share of their income towards housing and still not be able to meet their basic needs, while a high-income household might be considered cost-burdened but live comfortably. However, cost-burden has been shown to be a stong predictor of risk of foreclosure and eviction, food insecurity, and other financial issues.
Comparing cost-burdened status over time and against peer cities shows that Louisville tends to have lower rates of cost-burden than peer cities, however there are entrenched disparities in Louisville and across our peers.
CB_earntype %<>%
filter(
race == 'total') %>%
select( -race) %>%
pivot_wider(names_from = "earner_type_d", values_from = "cost_burden")
trend(CB_earntype,
multiple_earner:single_fem_earner:single_male_earner,
pctiles = F,
plot_title = "Cost Burden by Earner Type",
cat = c("Multiple Earners" = "multiple_earner", "Single Female Earner" = "single_fem_earner", "Single Male Earner" = "single_male_earner"),
y_title = 'Percent',
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
H_earntype_kids_cost_burden %<>%
filter(
var_type == 'percent',
sex == "female") %>%
pivot_wider(names_from = 'kd_pres', values_from = 'cost_burden') %>%
select(-sex) %>%
rename(kids = `TRUE`, no_kids = `FALSE`)
trend(H_earntype_kids_cost_burden,
kids:no_kids,
rollmean = 3,
plot_title = "Female Cost Burden by Presence of Children",
cat = c("Children" = "kids", "No Children" = "no_kids"),
y_title = 'Percent',
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
ranking(H_earntype_kids_cost_burden,
'no_kids',
plot_title = "Single Earner Female Cost Burden",
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
ranking(H_earntype_kids_cost_burden,
'kids',
plot_title = "Single-Earner Female Cost Burden with Children",
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
trend(filter(earntype_cb, earner_type_d == "single_fem_earner", race != "hispanic"),
cost_burden,
rollmean = 5,
pctiles = F,
plot_title = "Single Female Cost Burden by Year",
cat = 'race',
y_title = 'Percent',
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
trend(filter(H_earntype_kids_cost_burden, race != "hispanic"),
kids,
rollmean = 5,
pctiles = F,
plot_title = "Single Female Cost Burden by Year with Children",
cat = 'race',
y_title = 'Percent',
ylimits = c(0, 70),
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
trend(filter(H_earntype_kids_cost_burden, race != "hispanic"),
no_kids,
rollmean = 5,
pctiles = F,
plot_title = "Single Female Cost Burden by Year without Children",
cat = 'race',
y_title = 'Percent',
ylimits = c(0, 70),
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
This graph shows the percent of female single-earner households that are cost burdened by income group. As you would expect, fewer households are cost-burdened as their income increases.
Virtually no single female earners are cost-burdened when earning at least $70,000. However, most female single-earner households in Louisville make less than $30,000 per year, and most households in those income ranges are cost-burdened.
median_inc_single_fem <- lville_2019 %>%
group_by(earner_type_d) %>%
summarize(Med=Hmisc::wtd.quantile(HHINCOME, weights = HHWT, probs = 0.5))
these_labels <- paste0(dollar(seq(1, 273500, 10000), scale = 0.001, accuracy = 1, suffix = "k"))
cost_burden_sf <- lville_2019 %>%
filter(
sex == 'female',
earner_type == 'single_earner',
HHINCOME <= cut_95) %>%
mutate(
cost_burden = factor(cost_burden,
levels = rev(c(TRUE, FALSE)),
labels = rev(c("Cost Burdened", "Non Cost Burdened")),
ordered = TRUE),
inc_bins = cut(HHINCOME, seq(1, 283500, 10000),
labels = these_labels) %>%
factor(levels = these_labels, ordered = TRUE)
)
temp_df <- cost_burden_sf %>%
group_by(inc_bins, cost_burden) %>%
summarize(count = sum(HHWT), .groups = "drop") %>%
complete(inc_bins, cost_burden, fill = list(count = 0)) %>%
filter(!is.na(inc_bins)) %>%
group_by(inc_bins) %>%
mutate(percent = count / sum(count)) %>%
ungroup() %>%
filter(cost_burden == "Cost Burdened")
temp_df <- temp_df[1:14,]
cost_burden_sf_plot <- ggplot(temp_df,
aes(x = inc_bins,
y = percent,
group = 1)) +
geom_line(linetype = "dashed", color="#800055", size=2) +
geom_point(color="#800055", size=4) +
geom_vline( aes(xintercept = 34500), linetype = "dashed", colour="blue", size = 1.5)
# annotate("text", x=round(34500 - 2000), y=0.5, label=34500, angle=90 )
cost_burden_sf_plot <- cost_burden_sf_plot + glp_graph_theme
cost_burden_sf_plot <- cost_burden_sf_plot +
labs(
title = "Female Single Earner Cost Burden Level by Income",
) +
ylab(" ") +
xlab("Household Income") +
guides(color = FALSE) +
theme(
strip.text = element_blank()
) +
scale_y_continuous(labels = scales::percent)
cost_burden_sf_plot
Single-earner female-headed households are most likely to be cost-burdened when the head of household is in their 20s, and the rate of cost-burden generally decreases as they grow older and make more money, on average. However, cost-burden is still nearly 50% among all age groups.
cost_burden_age_sf %<>% drop_na(cost_burden) #this will need to be run once and then left alone if tweaking graphs
temp_df1 <- cost_burden_age_sf %>%
filter(earner_type_d == "single_fem_earner") %>%
mutate(
age_group = case_when(
age %in% 15:19 ~ NA_character_,
age %in% 20:29 ~ "20-29",
age %in% 30:39 ~ "30-39",
age %in% 40:49 ~ "40-49",
age %in% 50:59 ~ "50-59",
age %in% 60:69 ~ "60-69",
age %in% 70:79 ~ "70-79",
age >= 80 ~ "80+"))
temp_df1 %<>% filter(!is.na(age_group))
cost_burden_age_sf_facet_plt <- ggplot(temp_df1,
aes(x=age_group, y=HHWT , fill=cost_burden)) +
geom_bar(stat="identity", position='fill')
#facet_wrap(~earner_type_d)
cost_burden_age_sf_facet_plt <- cost_burden_age_sf_facet_plt + glp_graph_theme
cost_burden_age_sf_facet_plt <- cost_burden_age_sf_facet_plt +
theme(
legend.position = "top") +
labs(
title = "Cost Burdened Status by Age"
) +
ylab(" ") +
xlab(" ") +
scale_fill_manual(labels = c("Non Cost Burdened", "Cost Burdened"), values = c("#0E4A99", "#F58021")) +
#scale_x_discrete(guide = guide_axis(n.dodge=2)) +
scale_y_continuous(labels = scales::percent)
cost_burden_age_sf_facet_plt
m <- trend_data_maxmin(CB_earntype, "single_fem_earner")
# creates change variable starting at year 2000...perc point change in female sing eaners that are cost burdened
CB_earntype %>%
group_by(FIPS) %>%
mutate(change = single_fem_earner - single_fem_earner[year == 2000]) %>%
ungroup()%>%
ranking_data("change")%>%
pull_peers(add_info=T)
Homeownership is an important component of financial independence and stability.
Households with multiple earners are significantly more likely to own a home than those with a single income-earner. The rates of homeownership among single-earner male-headed households and single-earner female-headed households are fairly similar, though males have slightly higher rates of homeownership. Homeownership for female-headed households has remained fairly steady since 2010, while homeownership for male-headed and multiple-earner households has declined.
#also compares earner types
temp_df <- H_earntype %>%
filter(race == 'total') %>%
pivot_wider(names_from = "earner_type_d", values_from = "homeownership")
trend(temp_df,
multiple_earner:single_male_earner,
plot_title = "Homeownership by Year",
cat = c("Multiple Earners" = "multiple_earner", "Single Female" = "single_fem_earner", "Single Male" = "single_male_earner"),
pctiles = F,
y_title = 'Percent',
rollmean = 3,
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
Homeownership rates are drastically lower for female-headed households with children than for women without children. While women without children in Louisville consistently have much higher rates of homeownership than in peer cities, women with children tend to have lower rates of homeownership in Louisville than in peer cities.
As the ranking graphs show, Louisville ranks 3rd in homeownership among women without children, but 12th among women with children.
H_earntype_kids %<>%
filter(
var_type == 'percent',
sex == "female") %>%
pivot_wider(names_from = 'kd_pres', values_from = 'homeownership') %>%
select(-sex) %>%
rename(kids = `TRUE`, no_kids = `FALSE`)
trend(H_earntype_kids,
kids:no_kids,
rollmean = 3,
plot_title = "Female Homeownership by Presence of Children",
cat = c("Children" = "kids", "No Children" = "no_kids"),
y_title = 'Percent',
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
ranking(H_earntype_kids,
'no_kids',
plot_title = "Single Earner Female Homeownership",
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
Homeownership among women with children seems to be abnormally high in Omaha in 2019, though the data seems to be an outlier caused by an odd year of survey data. The true homeownership rate for women with children in Omaha is likely closer to 30%.
ranking(H_earntype_kids,
'kids',
plot_title = "Single-Earner Female Homeownership with Children",
title_scale = 0.8,
caption_text =
"Source: Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
There is a significant disparity in homeownership rates by race. While most white female-headed households are homeowners, only around 1 in 4 Black female-headed households are homeowners.
trend(filter(H_earntype, earner_type_d == "single_fem_earner", race %in% c("white", "black")),
homeownership,
rollmean = 5,
pctiles = F,
plot_title = "Single Female Homeownership by Race",
cat = 'race',
y_title = 'Percent',
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
Data broken down by both race and presence of children is fairly noisy due to the small sample size for many groups.
However, we can see that similar disparities exist, and are even more severe in households with children.
trend(filter(H_earntype_kids, race != "hispanic"),
kids,
rollmean = 5,
pctiles = F,
plot_title = "Single Female Homeownership by Race with Children",
cat = 'race',
y_title = 'Percent',
ylimits = c(0, 70),
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
trend(filter(H_earntype_kids, race != "hispanic"),
no_kids,
rollmean = 5,
pctiles = F,
plot_title = "Single Female Homeownership by Year without Children",
cat = 'race',
y_title = 'Percent',
ylimits = c(0, 70),
caption_text =
"Source Greater Louisville Project
Data from GLP analysis of ACS microdata from IPUMS-USA")
median_inc_single_fem <- lville_2019 %>%
group_by(earner_type_d) %>%
summarize(Med=Hmisc::wtd.quantile(HHINCOME, weights = HHWT, probs = 0.5))
these_labels <- paste0(dollar(seq(1, 273500, 10000), scale = 0.001, accuracy = 1, suffix = "k"))
homeownership_sf <- lville_2019 %>%
filter(
sex == 'female',
earner_type == 'single_earner',
HHINCOME <= cut_95) %>%
mutate(
homeownership = factor(homeownership,
levels = rev(c(TRUE, FALSE)),
labels = rev(c("Homeowner", "Renter")),
ordered = TRUE),
inc_bins = cut(HHINCOME, seq(1, 283500, 10000),
labels = these_labels) %>%
factor(levels = these_labels, ordered = TRUE)
)
temp_df <- homeownership_sf %>%
group_by(inc_bins, homeownership) %>%
summarize(count = sum(HHWT), .groups = "drop") %>%
complete(inc_bins, homeownership, fill = list(count = 0)) %>%
filter(!is.na(inc_bins)) %>%
group_by(inc_bins) %>%
mutate(percent = count / sum(count)) %>%
ungroup() %>%
filter(homeownership == "Homeowner")
temp_df <- temp_df[1:14,]
homeownership_sf_plot <- ggplot(temp_df,
aes(x = inc_bins,
y = percent,
group = 1)) +
geom_line(linetype = "dashed", color="#800055", size=2) +
geom_point(color="#800055", size=4) +
geom_vline( aes(),xintercept = 25, linetype = "dashed", colour="blue", size = 1.5)
#our x-axis not HHINCOME...
# annotate("text", x=round(34500 - 2000), y=0.5, label=34500, angle=90 )
homeownership_sf_plot <- homeownership_sf_plot + glp_graph_theme
homeownership_sf_plot <- homeownership_sf_plot +
labs(
title = "Female Single Earner Homeownership Level by Income",
) +
ylab(" ") +
xlab("Household Income") +
guides(color = FALSE) +
theme(
strip.text = element_blank()
) +
scale_y_continuous(labels = scales::percent)
homeownership_sf_plot
homeownership_age_sf %<>% drop_na(homeownership) #this will need to be run once and then left alone if tweaking graphs
temp_df1 <- homeownership_age_sf %>%
filter(earner_type_d == "single_fem_earner") %>%
mutate(
age_group = case_when(
age %in% 15:19 ~ NA_character_,
age %in% 20:29 ~ "20-29",
age %in% 30:39 ~ "30-39",
age %in% 40:49 ~ "40-49",
age %in% 50:59 ~ "50-59",
age %in% 60:69 ~ "60-69",
age %in% 70:79 ~ "70-79",
age >= 80 ~ "80+"))
temp_df1 %<>% filter(!is.na(age_group))
homeownership_age_sf_facet_plt <- ggplot(temp_df1,
aes(x=age_group, y=HHWT , fill=cost_burden)) +
geom_bar(stat="identity", position='fill')
#facet_wrap(~earner_type_d)
homeownership_age_sf_facet_plt <- homeownership_age_sf_facet_plt + glp_graph_theme
homeownership_age_sf_facet_plt <- homeownership_age_sf_facet_plt +
theme(
legend.position = "top") +
labs(
title = "Cost Burdened Status by Age"
) +
ylab(" ") +
xlab(" ") +
scale_fill_manual(labels = c("Renter", "Homeowner"), values = c("#0E4A99", "#F58021")) +
#scale_x_discrete(guide = guide_axis(n.dodge=2)) +
scale_y_continuous(labels = scales::percent)
homeownership_age_sf_facet_plt
Educational attainment among single-earner headed households is fairly similar for males and females.
E_singM_singF <- census_microdata081122_person %>%
filter(year %in% 2019,
earner_type == 'single_earner') %>%
group_by(sex, educ) %>%
summarize(n=sum(PERWT, na.rm = TRUE)) %>%
mutate(
total = sum(n),
rate = n/sum(n)*100,
educ = factor(educ,
levels = rev(c("no_hs", "hs", "some_col", "assoc", "bach","grad")),
ordered = TRUE))
E_singM_singF_plot <- ggplot(E_singM_singF,
aes(x=sex,
y=rate,
fill = educ)) +
geom_bar(stat="identity", position = "fill") +
geom_text(aes(y = rate, label = percent(rate, scale = 1, accuracy = 0.1)),
position = position_fill(vjust = 0.5), size = 24,
color = "white")
#E_singM_singF_plot <- E_singM_singF_plot + facet_wrap(~kd_pres)
E_singM_singF_plot <- E_singM_singF_plot + glp_graph_theme
E_singM_singF_plot <- E_singM_singF_plot +
theme(
legend.position = "right",
plot.subtitle = element_text(size = 48, hjust = 0.5)) +
labs(
title = "Education by Gender",
subtitle = "Data include single-earner households") +
scale_fill_manual(name = "",
values = c("#0E4A99", "#F58021", "#00A9B7", "#800055", "#356E39", "#CFB94C"),
labels = c("Graduate","Bachelor", "Associate", "Some College", "High School", "No High School")) +
scale_x_discrete (labels = c("female" = "Female", "male" = "Male")) +
ylab("") +
xlab("") +
scale_y_continuous(labels = scales::percent)
E_singM_singF_plot
If we break things down by gender and the presence of children, we see that heads of households with children have more education, on average, than those without children. Among males and females with and without children, the most-educated group is females with children.
E_singM_singF <- census_microdata081122_person %>%
filter(year %in% 2019,
earner_type == 'single_earner') %>%
group_by(sex, educ, kd_pres) %>%
summarize(n=sum(PERWT, na.rm = TRUE)) %>%
group_by(sex, kd_pres) %>%
mutate(
rate = n/sum(n),
educ = factor(educ,
levels = rev(c("no_hs", "hs", "some_col", "assoc", "bach","grad")),
ordered = TRUE),
kd_pres = factor(kd_pres, levels = c(TRUE, FALSE), labels = c("With Children", "Without Children"))) %>%
ungroup()
E_singM_singF_plot <- ggplot(E_singM_singF,
aes(x=sex,
y=rate,
fill = educ)) +
geom_bar(stat="identity", position = "fill")
E_singM_singF_plot <- E_singM_singF_plot +
facet_wrap(~kd_pres) +
geom_text(aes(y = rate, label = percent(rate, accuracy = 0.1)),
position = position_fill(vjust = 0.5),
size = 24,
color = "white")
E_singM_singF_plot <- E_singM_singF_plot + glp_graph_theme
E_singM_singF_plot <- E_singM_singF_plot +
theme(
legend.position = "right",
strip.text = element_text(size = 40),
plot.subtitle = element_text(size = 48, hjust = 0.5)
) +
labs(
title = "Education by Gender and Presence of Children",
subtitle = "Data include single-earner households") +
ylab(" ") +
xlab(" ") +
scale_fill_manual(name = "",
values = c("#0E4A99", "#F58021", "#00A9B7", "#800055", "#356E39", "#CFB94C"),
labels = c("Graduate","Bachelor", "Associate", "Some College", "High School", "No High School")) +
scale_x_discrete (labels = c("female" = "Female", "male" = "Male")) +
scale_y_continuous(labels = scales::percent) +
guides(fill = guide_legend(label.position = "right"))
E_singM_singF_plot
Among the heads of female, single-earner households, white-headed households tend to have the highest levels of education.
This chart also reflects the broad data underlying the “other” category in our data. Women of some other race than white, Black, anc Hispanic have very high rates of postsecondary attainment as well as the highest rate of those without a high school degree.
E_singF_race <- lville_2019 %>%
filter(
sex == 'female',
earner_type == 'single_earner') %>%
group_by(race, educ) %>%
summarize(n=sum(PERWT, na.rm = TRUE)) %>%
mutate(
total = sum(n),
rate = n/sum(n)*100,
educ = factor(educ,
levels = rev(c("no_hs", "hs", "some_col", "assoc", "bach","grad")),
ordered = TRUE),
race = factor(race,
levels = c("white", "black", "hispanic", "other"),
labels = c("White", "Black", "Hispanic", "Other")))
ggplot(E_singF_race, aes(x = "", y = rate, fill = educ)) +
geom_bar(stat="identity", width=2, color="white") +
geom_text(aes(label = scales::percent(rate, scale = 1, accuracy = 0.1), x = 1.5),
position = position_stack(vjust = 0.5),
size = 10,
color = "white") +
coord_polar("y", start=0) +
glp_graph_theme +
scale_fill_manual(name = "",
values = c("#0E4A99", "#F58021", "#00A9B7", "#800055", "#356E39", "#CFB94C"),
labels = c("Graduate","Bachelor", "Associate", "Some College", "High School", "No High School")) +
labs(
title = "Education by Race",
subtitle = "Data include female single-earner households") +
theme(
axis.title.x=element_blank(),
axis.title.y=element_blank(),
axis.text = element_blank(),
strip.text = element_text(size = 40),
panel.grid = element_blank(),
plot.subtitle = element_text(size = 48, hjust = 0.5),
legend.position = "right") +
facet_wrap(~race)
### none of the edu below will be used
edu_by_kids <- function(race_group) {
v <- census_microdata081122_person %>%
filter(year %in% 2017:2019,
earner_type == 'single_earner',
race == race_group) %>%
group_by(sex, educ, kd_pres) %>%
summarize(n=sum(PERWT, na.rm = TRUE)) %>%
mutate(
total = sum(n),
rate = n/sum(n)*100,
educ = factor(educ,
levels = rev(c("no_hs", "hs", "some_col", "assoc", "bach","grad")),
ordered = TRUE))
v <- ggplot(E_singM_singF,
aes(x=sex,
y=rate,
fill = educ)) +
geom_bar(stat="identity", position = "fill")
v <- v + facet_wrap(~kd_pres)
v <- v + glp_graph_theme
v <- v +
theme(
legend.position = "right"
) +
labs(
title = "Single Earner Education Levels by Gender",
) +
ylab(" ") +
xlab(" ") +
scale_fill_discrete(
labels = c("Graduate","Bachelor", "Associate", "Some College", "High School", "No High School")) +
scale_x_discrete (labels = c("female" = "Female", "male" = "Male")) +
scale_y_continuous(labels = scales::percent)
v
}
edu_by_kids("black")
edu_by_kids("white")
edu_by_kids("hispanic")
edu_by_kids("other")
E_singF_race <- lville_2019 %>%
filter(
sex == 'female',
earner_type == 'single_earner') %>%
group_by(race, educ) %>%
summarize(n=sum(PERWT, na.rm = TRUE)) %>%
mutate(
total = sum(n),
rate = n/sum(n)*100,
educ = factor(educ,
levels = rev(c("no_hs", "hs", "some_col", "assoc", "bach","grad")),
ordered = TRUE))
E_singF_race_plot <- ggplot(E_singF_race, aes(x=race, y=rate, fill=educ)) +
geom_bar(stat="identity", position='fill')
E_singF_race_plot <- E_singF_race_plot + glp_graph_theme
E_singF_race_plot <- E_singF_race_plot +
theme(
legend.position = "right"
) +
labs(
title = "Single Female Education Breakdown",
) +
ylab(" ") +
xlab("Race") +
scale_fill_discrete(labels = c("Graduate","Bachelor", "Associate", "Some College", "High School", "No High School")) +
scale_x_discrete (labels = c("female" = "Female", "male" = "Male")) +
scale_y_continuous(labels = scales::percent)
E_singF_race_plot
##earner types over time
earner_trend <- census_microdata081122_person %>%
group_by(year, earner_type_d) %>%
summarize(n=sum(HHWT, na.rm = TRUE)) %>%
mutate(
total = sum(n),
rate = n/sum(n)*100)
earner_trend_plt <- ggplot(earner_trend,
aes(x=year, y=rate, fill=earner_type_d),
color="#00A9B7") +
geom_bar(stat="identity", position='fill')
earner_trend_plt <- earner_trend_plt + glp_graph_theme
earner_trend_plt <- earner_trend_plt +
theme(
legend.position = "right"
#strip.text = element_blank()
) +
labs(
title = "Earner Type Trend"
) +
ylab(" ") +
xlab(" ") +
scale_fill_discrete(labels = c("Multiple Earner", "Single Female Earner", "Single Male Earner")) +
scale_y_continuous(labels = scales::percent)
earner_trend_plt
What is Person X’s sex? Mark (X) ONE box.
[ ] Male
[ ] Female
Is Person X of Hispanic, Latino, or Spanish origin?
[ ] No, not of Hispanic, Latino, or Spanish origin
[ ] Yes, Mexican, Mexican Am., Chicano
[ ] Yes, Puerto Rican
[ ] Yes, Cuban
[ ] Yes, another Hispanic, Latino, or Spanish origin – Print origin, for example, Argentinean, Colombian, Dominican, Nicaraguan, Salvadoran, Spaniard, and so on. –> ______________________________________
What is Person X’s race? Mark (X) one or more boxes.
[ ] White
[ ] Black or African Am.
[ ] American Indian or Alaska Native – Print name of enrolled or principal tribe. –> __________________
[ ] Asian Indian
[ ] Japanese
[ ] Native Hawaiian
[ ] Chinese
[ ] Korean
[ ] Guamanian or Chamorro
[ ] Filipino
[ ] Vietnamese
[ ] Samoan
[ ] Other Asian – Print race, for example, Hmong, Laotian, Thai, Pakistani, Cambodian, and so on. –> _____________________
[ ] Other Pacific Islander – Print race, for example, Fijian, Tongan, and so on. –>______________________
[ ] Some other race – Print race. –> ____________________________________________________