Available Seat Miles (ASMs)

A common industry measurement of airline output that refers to one aircraft seat flown one mile, whether occupied or not. An aircraft with 100 passenger seats, flown a distance of 100 miles, generates 10,000 available seat miles.

# Domestic Available Seat Miles (ASMs), Scheduled Passenger Flights (ASMDD11)
indicator <-fredr_series_observations(series_id = "ASMDD11", 
      observation_start = as.Date("2019-01-01"))

indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
  geom_line(mapping = aes(x=date,y=value/1000),color="red",size=1)  +
      labs(title = "Domestic Available Seat Miles (ASMs)", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}\n Seasonally adjusted"),
       x="Monthly", y="Millions of Miles",
       caption = "Data source: FRED Federal Reserve \n Illustration by @JoeLongSanDiego")+
    theme_economist()

International Available Seat Miles (ASMs) Scheduled Passenger Flights (ASMID11)

indicator <-fredr_series_observations(series_id = "ASMID11", 
      observation_start = as.Date("2019-01-01"))

indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
  geom_line(mapping = aes(x=date,y=value/1000),color="red",size=1)  +
      labs(title = " International Available Seat Miles (ASMs)", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}\n Seasonally adjusted"),
       x="Monthly", y="Millions of Miles",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Enplanements (Passenger Boarding) for U.S. Air Carrier Domestic, Scheduled Passenger Flights (ENPLANEDD11)

indicator <-fredr_series_observations(series_id = "ENPLANEDD11", 
      observation_start = as.Date("2019-01-01"))

indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
      labs(title = "Passenger Boarding (Enplanement) for U.S. Air Carrier Domestic", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()

Enplanements for U.S. Air Carrier International, Scheduled Passenger Flights (ENPLANEID11)

indicator <-fredr_series_observations(series_id = "ENPLANEID11", 
      observation_start = as.Date("2019-01-01"))

indicator %>% ggplot() + 
   geom_rect(aes(xmin= dmy('01-01-2020'), xmax=dmy('01-09-2020'), ymin = -Inf, ymax = Inf),
                   fill = "grey", alpha = 0.03)+
  geom_line(mapping = aes(x=date,y=value),color="red",size=1)  +
      labs(title = "Passenger Boarding (Enplanement) for U.S. Air Carrier _ International", 
          subtitle = str_glue("From {min(indicator$date)} through {max(indicator$date)}"),
       x="Monthly", y="Thousands",
       caption = "Data source: FRED Federal Reserve\nIllustration by @JoeLongSanDiego")+
    theme_economist()