What Is The State of Food Security and Nutrition in the US?

Analyzing household level food security situation in the United States

Author
Affiliations

John Karuitha

Karatina University, School of Business

University of the Witwatersrand, School of Construction Economics & Management

Published

December 30, 2023

Modified

December 30, 2023

1 Introduction

The United Nations Food and Agriculture Organization’s report, “The State of Food Security and Nutrition in the World 2022,” often makes people think that food insecurity is a problem only in other parts of the world, not in the United States. However, this article takes a closer look at the situation here at home. It argues that malnutrition and hunger affect people in the United States, not just in other places. By focusing on the complexities of food security within the country, we aim to show that this issue isn’t only about faraway locations but also about challenges faced by people right here in the United States when it comes to having enough nutritious food 1.

The issue of food security is critical. Insufficient access to nutritious and balanced meals can lead to nutritional deficiencies during critical stages of growth and development. This may result in stunted growth, delayed cognitive development, and a higher susceptibility to health issues (Thomas, Miller, and Morrissey 2019). Let us look at these effects in turns. These deficiencies can lead to physical, social, and economic impacts on children now and in the future.

2 Objective

This essay seeks explores the landscape of food security in the United States, scrutinizing the accessibility, availability, and adequacy of food resources. By navigating this terrain, the aim is to contribute to the dialogue on food security in the United States and not just “elsewhere”. The end result are insights that can inform evidence-based strategies to address existing vulnerabilities and promote resilience within the nation’s food systems.

The analysis has the following specific aims;

1. Explore the state of food security and nutrition by state broken down by men, women, children and by age groups.

2. Demonstrate correlations that exist between level of poverty and food insecurity, malnutrition and starvation.

3. Implications of food insecurity for children as they mature into adults. (that is, Will they become fully functional citizens or will they require continued support?).

4. Your data visualizations need to tell the story for a political audience that you were lobbying to address the issue of food insecurity in the US.

3 Summary of Results

  1. There is a sharp rise in the proportion of households with low food security from 2021.

  2. About 17% of households are food insecure. Of these households;

  • 7.8% of children live in households with low food security.

  • 1% of children live in households with low food security, exposing them to starvation.

  1. There is a direct link between poverty and food insecurity. Over 30% of people in the poorest households food insecure and this proportion has risen steeply between 2021 and 2022.

  2. Food insecurity is highest in households with single parents. 33% of female headed households were food insecure in 2022.

  3. Failure to address food insecurity in children could have profound physical, social and economic impacts on children as they mature into adults.

4 Definitions

Food security: Food security means access by all people at all times to enough food for an active, healthy life (United States Department of Agriculture 2023).

Household: A house and its occupants regarded as a unit (Dictionary 1989).

Children: a young human being below the legal age of majority (Dictionary 1989).

5 Data

We source data from the United States Department of Agriculture (USDA). The data capture the prevalence of food insecurity among children in households with various characteristics. For instance, we have data on food security among male headed households (no spouse). We also have data on households broken down by race and regions across the United States2.

USDA and Food Security

USDA’s Economic Research Service (ERS) plays a leading role in research on food security and food security measurement in U.S. households and communities. USDA, ERS provides data and support to scholars’ research on food security.

Code
if(!require(pacman)){
        install.packages('pacman')
}

p_load(tidyverse, janitor, skimr, 
       ggthemes, gt, correlationfunnel,
       mice, doParallel, tidymodels,
       klaR, ranger, rpart, kknn,
       kernlab, LiblineaR, brulee,
       conflicted, themis, xgboost,
       usemodels, AppliedPredictiveModeling,
       discrim, baguette, nnet, patchwork,
       kableExtra, caret, corrplot, readxl)

p_load_gh('datarootsio/artyfarty')

theme_set(artyfarty::theme_scientific())
options(digits = 2)
options(scipen = 999)

## Speed
## Hasten code execution by parallel computing
all_cores <- parallel::detectCores(logical = FALSE)
cl <- makeCluster(all_cores)
registerDoParallel(cl)
Code
## Get general food security ----
food_security <- readxl::read_xlsx('dataset/foodsecure_pie2022.xlsx') %>%
  set_names(c("food_security_status", "prop")) %>% 
  dplyr::filter(!is.na(prop),
                !is.na(food_security_status)) %>% 
  mutate(prop = prop %>% as.numeric() %>% round(1))


## Get household food security ----
household <- readxl::read_xlsx("dataset/household_pie2022.xlsx") %>% 
  set_names("household_food_security", "prop") %>% 
  dplyr::filter(!is.na(household_food_security),
                !is.na(prop)) %>% 
  mutate(prop = prop %>% as.numeric() %>% round(1))

## Trends in food insecurity ----
trends <- readxl::read_xlsx('dataset/trends2022.xlsx') %>% 
  set_names(c("year", "Food_security_low_and_very_low",
              "Food_security_very_low")) %>% 
  mutate(
    year = parse_integer(year),
    Food_security_low_and_very_low = as.numeric(Food_security_low_and_very_low),
    Food_security_very_low = as.numeric(Food_security_very_low)
  ) %>% 
  dplyr::filter(
    !is.na(year),
    !is.na(Food_security_low_and_very_low),
    !is.na(Food_security_very_low)
  ) %>% 
  pivot_longer(-year, names_to = "state")

## Food insecure ----
insecure <- readxl::read_xlsx('dataset/insecurity2022.xlsx') %>% 
  set_names(c('class', 'subclass', 
              'perc_2021', 'perc_2022', "perc", "sig")) %>% 
  dplyr::filter(!is.na(class),
         !is.na(subclass),
         !is.na(perc_2021))

##  very low security----
very_low <- readxl::read_xlsx('dataset/verylow2022.xlsx') %>% 
  set_names(c('class', 'subclass', 
              'perc_2021', 'perc_2022', "perc", "sig")) %>% 
  dplyr::filter(!is.na(class),
         !is.na(subclass),
         !is.na(perc_2021))

6 State of Food Security in the United States

Figure 1 below shows that while food insecurity among households has been falling from 2010, there is a steep rise in food insecurity from 2020. The rise is evident among the households with very low food insecurity and the households with both low and very low food security. Importantly, the households with very low food security have consistently been above 3% and above 10% for households with low and very low food security. This observation means that there no measures in place to address food insecurity among the poor. Alternatively, measures in place to address food insecurity are either badly executed or ineffective in addressing the persistent food insecurity. Food insecurity among the very vulnerable has hit a high of 5% that was prevalent in between 2007 and 2015. This rise in food insecurity is a cause for concern. It is important to establish the factors that lead to the uptick in the cases of food insecurity from around 2020. If not addressed, this rise is likely to take the United States back to the years of high food insecurity of the 2010’s. COVID 19 economic slowdown could explain some of the observed rise in food insecurity. Steps to mitigate this reversal is critical.

Code
trends %>% 
  mutate(state = case_when(
    state == "Food_security_low_and_very_low" ~ "Low or very low",
    .default = "Very Low"
  )) %>% 
  rename(Food_Security = state) %>% 
  ggplot(mapping = aes(x = year, y = value, color = Food_Security)) + 
  geom_line() + 
  ylim(0, 15) + 
  labs(x = "Year", y = "Percentage- Food Insecurity Status",
       title = "Food Insecurity in the United States",
       subtitle = "We see a steep rise in food insecurity from 2021 after food insecurity \ndropped between 2000 and 2010.") + 
  scale_color_manual(values = pal("economist")) + 
  theme(legend.position = "top")

Trends in Food Insecurity in the US

6.1 Food Insecurity, gender (men, women, children) and age groups

A substantial number of people in the United States are food insecure. Figure 2 below shows that about 17% of households fall under this category. We also see that over 8% of adults with children are food insecure. This means that these adults are sacrificing their calorie intake to feed the children. Moreover, 7.8% of children in the United States live in households that have low food security putting their health at risk. What is more, 1% of children live in homes with very low food security. These two latter categories put the children at a high risk of malnutrition, which could further affect their future potential. Thus, more resources should be set aside to support poor households, especially households with children.

Code
food_security %>% 
  mutate(food_security_status = case_when(
    food_security_status == "Food insecurity among adults only in households with children" ~ "Food Insecure Adults with Children",
    food_security_status == "Low food security among children" ~ "Children: Low security",
    food_security_status == "Very low food security among children" ~ "Children: Very Low security",
    .default = food_security_status
  )) %>% 
  mutate(prop = case_when(
    food_security_status == "Food-secure households" ~ 100-82.7,
    .default = prop
  )) %>% 
  mutate(food_security_status = case_when(
    food_security_status == "Food-secure households" ~ "Food insecure households",
    .default = food_security_status
  )) %>% 
  mutate(
    food_security_status = fct_reorder(food_security_status, prop)
  ) %>% 
  ggplot(mapping = aes(x = food_security_status, y = prop, 
                       fill = food_security_status)) + 
  geom_col(show.legend = FALSE) + 
  labs(
    x = "",
    y = "Proportion",
    title = "Food Security Among Children"
  ) + 
  coord_flip() + 
  scale_fill_manual(values = pal("economist"))

Food Insecurity among Children in the US

Households with female heads (no spouse) have a disproportionately high incidence of food insecurity, followed by households with male heads (no spouse). Figure () shows that 33.1% and 21.2% of children in houses headed by a woman (no spouse) are food insecure in 2022. This is a significant rise from 2021. Pertinent mitigation measure should also target households with single parents. These households have the highest incidence of food insecurity among all the classes. When you factor in race, the picture could get even worse.

Code
insecure %>% 
  dplyr::filter(subclass %in% c("Female head, no spouse",
                         "Male head, no spouse",
                         "Women living alone",
                         "Men living alone")) %>% 
  dplyr::select(-class, -sig, -perc) %>% 
  pivot_longer(-subclass, 
               names_to = "Year") %>% 
  mutate(Year = str_remove(Year, "^perc_"),
         Year = as.numeric(Year)) %>% 
  ggplot(mapping = aes(x = subclass, 
                       y = value,
                       fill = factor(Year))) + 
  geom_col(position = "dodge") + 
  theme(legend.position = "top",
        legend.title = element_blank()) + 
  scale_fill_manual(values = pal("economist")) + 
  labs(x = "", y = "Proportion, %",
       title = "Food Security by Gender",
       subtitle = "Households with single parents are highly prone to food insecurity more than any other\ncategory of people")

Food Insecurity by Gender in the US

6.2 Poverty, food insecurity, malnutrition and starvation

Figure 3 and 4 below shows the breakdown of food insecurity by poverty levels. The first figure shows the proportion of people with low and very low levels of food security. First, we see that the rise in food insecurity among all poverty levels between 2020 and 2021. We also see food insecurity rises the lower the level of Household income to poverty ratio. Specifically, poorer people have a higher incidence of low or very low food insecurity. What is worrying is that the proportion was over 30% in 2021 and rises even further in 2022. Thus, it is paramount to craft strategies that target low income earners from food insecurity. Thus, more resources should be set aside to support poor households, especially households with children.

Code
insecure %>% 
  dplyr::filter(class == "Household income-to-poverty ratio:") %>% 
  dplyr::select(-perc, -sig) %>% 
  pivot_longer(-c(class, subclass),
               names_to = "Year") %>% 
  mutate(Year = str_remove(Year, "^perc\\_"),
         Year = as.numeric(Year)) %>% 
  mutate(subclass = fct_reorder(subclass, value)) %>% 
  ggplot(aes(x = subclass, y = value, fill = factor(Year))) + 
  geom_col(position = "dodge") + 
  scale_fill_manual(values = pal("economist")) + 
  theme(legend.position = "top") + 
  labs(x = "Household income-to-poverty ratio",
       y = "Proportion",
       title = "Food Security and Poverty Levels",
       subtitle = "We see a sharp rise in food insecurity in all poverty levels between 2021 and 2022") + 
  theme(legend.title = element_blank())

Food Insecurity and Poverty in the US

Figure 4 shows the incidence of very low food insecurity among households. The figure shows that food insecurity gets worse with poverty. More than 15% of households with a Household income to poverty ratio of less than 1 are food insecure.

Code
very_low %>% 
  dplyr::filter(class == "Household income-to-poverty ratio:") %>% 
  dplyr::select(-perc, -sig) %>% 
  pivot_longer(-c(class, subclass),
               names_to = "Year") %>% 
  mutate(Year = str_remove(Year, "^perc\\_"),
         Year = as.numeric(Year)) %>% 
  mutate(subclass = fct_reorder(subclass, value)) %>% 
  ggplot(aes(x = subclass, y = value, fill = factor(Year))) + 
  geom_col(position = "dodge") + 
  scale_fill_manual(values = pal("economist")) + 
  theme(legend.position = "top") + 
  labs(x = "Household income-to-poverty ratio",
       y = "Proportion",
       title = "Proportion of People with Very Low Food Security by Poverty Levels",
       subtitle = "We see a sharp rise in food insecurity in all poverty levels between 2021 and 2022") + 
  theme(legend.title = element_blank())

Propoprtion of People with Very Low Food Security by Poverty Levels

6.3 Implications of food insecurity for children as they mature into adults.

Food insecurity during childhood can have profound and lasting effects on individuals as they mature into adults. Here are several ways in which food insecurity can impact children long-term development:

6.3.1 Nutritional Deficiencies:

Insufficient access to nutritious and balanced meals can lead to nutritional deficiencies during critical stages of growth and development. This may result in stunted growth, delayed cognitive development, and a higher susceptibility to health issues (Thomas, Miller, and Morrissey 2019). Let us look at these effects in turns.

6.3.2 Cognitive Development:

Inadequate nutrition, especially during early childhood, can negatively impact cognitive development. Children experiencing food insecurity may face challenges in concentration, memory, and academic achievement, affecting their long-term educational outcomes (Jyoti, Frongillo, and Jones 2005; Ke and Ford-Jones 2015).

6.3.3 Health Issues:

Food-insecure children are more vulnerable to a range of health problems, including iron deficiency anemia, weakened immune systems, and chronic conditions like diabetes and cardiovascular diseases. These health issues can persist into adulthood, affecting overall well-being.

6.3.4 Behavioral and Emotional Challenges:

Food insecurity can contribute to increased stress and anxiety in children. Chronic exposure to uncertainty about food availability can lead to behavioral issues, emotional distress, and a higher risk of mental health problems as they grow older.

6.3.5 Educational Attainment:

Children facing food insecurity may experience disruptions in their ability to concentrate and participate in school activities. This can impact their educational attainment, potentially limiting future opportunities for higher education and employment (Jyoti, Frongillo, and Jones 2005).

6.3.6 Economic Productivity:

Adults who experienced food insecurity during childhood may face challenges in terms of economic productivity. The long-term impact on physical and mental health can affect their ability to secure stable employment, leading to financial instability.

6.3.7 Social Relationships:

Food insecurity can influence social relationships. Children who grow up with inadequate access to food may experience social stigma, and the stress associated with food scarcity can impact their ability to form and maintain healthy relationships later in life.

6.3.8 Inter-generational Impact:

The cycle of food insecurity can perpetuate across generations. Adults who experienced food insecurity as children may face challenges in providing stable and adequate nutrition for their own families, continuing the cycle of vulnerability.

Efforts to address food insecurity in childhood are crucial not only for the immediate well-being of individuals but also for breaking the cycle of poverty and improving overall community health and resilience. Comprehensive strategies that encompass nutritional support, education, and economic empowerment can play a vital role in mitigating the long-term impacts of food insecurity on individuals as they transition from childhood to adulthood.

7 Conclusion

This essay seeks explored the landscape of food security in the United States, scrutinizing the accessibility, availability, and adequacy of food resources. 7.8% of children live in households with low food security. 1% of children live in households with low food security, exposing them to starvation. Single parent households are the worst affected by food insecurity. Failure to address food insecurity in children could have profound physical, social and economic impacts on children as they mature into adults.

References

Dictionary, Oxford English. 1989. “Oxford English Dictionary.” Simpson, Ja & Weiner, Esc 3.
Jyoti, Diana F, Edward A Frongillo, and Sonya J Jones. 2005. “Food Insecurity Affects School Children’s Academic Performance, Weight Gain, and Social Skills.” The Journal of Nutrition 135 (12): 2831–39.
Ke, Janice, and Elizabeth Lee Ford-Jones. 2015. “Food Insecurity and Hunger: A Review of the Effects on Children’s Health and Behaviour.” Paediatrics & Child Health 20 (2): 89–91.
Thomas, Margaret, Daniel P Miller, and Taryn W Morrissey. 2019. “Food Insecurity and Child Health.” Pediatrics 144 (4).
United States Department of Agriculture. 2023. “Economic Research Service.” 2023. https://www.ers.usda.gov/topics/food-nutrition-assistance/food-security-in-the-u-s/.

Footnotes

  1. Find the full report on this site https://www.fao.org/documents/card/en/c/cc0639en.↩︎

  2. The USDA website is https://www.ers.usda.gov/topics/food-nutrition-assistance/food-security-in-the-u-s/↩︎