TX Mothers Under 18

Author

CRG

Mothers in Texas Ages 13-17

Used 5-Year Estimates, 2023 via IPUMS

Pre-filtered for age, sex, state.

library(ipumsr,quietly = T)
library(dplyr,quietly = T)

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(ggplot2,quietly = T)
library(survey,quietly = T)

Attaching package: 'survey'
The following object is masked from 'package:graphics':

    dotchart
ddi <- read_ipums_ddi("C:/Users/rayo-garza/OneDrive - Center for Public Policy Priorities/Documents/R2024/usa_00079.xml")
dat <- read_ipums_micro(ddi)
Use of data from IPUMS USA is subject to conditions including that users should cite the data appropriately. Use command `ipums_conditions()` for more details.
dat <- zap_labels(dat)

# str(dat)

Total Mothers Ages 13-17

library(dplyr)

under_18_mom <- dat |>
  filter(NCHILD > 0) |>
  summarise(
    total = sum(PERWT)   
  )

print(under_18_mom)
# A tibble: 1 × 1
  total
  <dbl>
1  3000

Approximately 3,000 mothers ages 13-17 in Texas according to latest ACS estimates. These estimates are based on weighted person-level data identifying females living in households with their own children, therefore, there is high liklihood that this estimate is an under count. This figure aligns closely with CDC’s 2023 provisional natality data, which reports 3,158 births in Texas to mothers in the same age range, confirming that the ACS-based population estimate is well within expected bounds. Note that CDC estimates were limited to age bracket 15-19. See screenshot from CDC WONDER below:

You can see more info on teen birth rates from CDC Texas Health Profile here: https://www.cdc.gov/nchs/pressroom/states/texas/tx.htm

Mothers 13-17 by Age Group

# by age group
mothers_by_age <- dat |>
  filter(NCHILD > 0) |>
  group_by(AGE) |>
  summarise(
    weighted_total = sum(PERWT),
    unweighted_n   = n()
  ) |>
  arrange(AGE)

print(mothers_by_age)
# A tibble: 3 × 3
    AGE weighted_total unweighted_n
  <int>          <dbl>        <int>
1    15            516            8
2    16            523           24
3    17           1961           74
library(ggplot2)

ggplot(mothers_by_age, aes(x = factor(AGE), y = weighted_total)) +
  geom_col(fill = "#4682B4") +
  geom_text(aes(label = round(weighted_total)), vjust = -0.5, size = 4) +
  labs(
    title = "Estimated Number of Mothers (Ages 15–17) in Texas",
    subtitle = "Weighted totals from IPUMS sample data",
    x = "Age",
    y = "Estimated number of mothers"
  ) +
  theme_minimal(base_size = 14)