# number of years lagnumb_yr_lag <- year_chosen -2017OR_selected <- OR_pct_of_GDP %>%select_activity_state_year(act_txt = activity_chosen)growth_2017_2023_scalar <- OR_selected %>%group_by(Year) %>%summarise(OR_VA_yearly_total =sum(OR_VA)) %>%ungroup() %>%mutate(growth = ((OR_VA_yearly_total /lag(OR_VA_yearly_total, numb_yr_lag)) -1)*100) %>%filter(!is.na(growth)) %>%pull(growth)growth_2017_2023_scalar
Advocating for the ATV/UTV recreation requires a solid foundation of data to highlight its significance. According to the U.S. Bureau of Economic Analysis (BEA) Outdoor Recreation Satellite Account (ORSA), the Motorcycling/ATVing sector experienced an impressive 43.5% growth in economic value from 2017 to 2023 in the United States. This remarkable expansion underscores both the increasing popularity of ATV/UTV activities and their substantial economic impact.
ATV Recreation in Vermont
Code
## Chart 1 Outdoor Recreation Value Added as a Share of GDP ----OR_selected <- OR_pct_of_GDP %>%select_activity_state_year(act_txt = activity_chosen, state_txt = state_chosen)OR_selected %>%ggplot(aes(Year, OR_VA)) +geom_line(linewidth =1.5, color ="lightblue") +scale_y_continuous(label = scales::dollar_format(scale =1e-3)) +scale_x_continuous(breaks =seq(2017,2023,1)) +geom_text(aes(label = scales::dollar(OR_VA/1000, accuracy =1)), col ="midnightblue") +theme_tq() +labs(title =str_glue("{state_chosen}: {activity_chosen}"),subtitle =" Value Added in Millions of Dollars",y =NULL, x =NULL)
In 2023, Vermont’s ATV/UTV recreation generated $16 million in value added, reflecting a 31.9% growth since 2019, compared to 25.2% in the overall state economy during the same period.
Code
OR_selected <- OR_pct_of_GDP %>%select_activity_state_year(act_txt = activity_chosen, year_txt = year_chosen)OR_selected %>%arrange(-pct) %>%head(10) %>%ggplot(aes(pct, fct_reorder(state, pct))) +geom_col(fill ="midnightblue") +geom_text(aes(label = scales::percent(pct, accuracy=0.01)), hjust =1, col ="white") +scale_x_continuous(labels = scales::percent_format(accuracy=0.01)) +theme_tq() +labs(title =str_glue("Top 10 States in {activity_chosen}"),subtitle =str_glue("Value Added as a Share of State GDP, {year_chosen}"),x ="Percent of State GDP", y =NULL)
In 2023, ATV/UTV recreation accounted for 0.04% of Vermont’s gross domestic product (GDP) — attaining number 28 position in the United States.
Outdoor Recreation Activity Rankings
Code
df <- OR_cleaned %>%filter_by_act_by_state_by_year(state_lab = state_chosen)# create slope graphnewggslopegraph(df, Year, OR_VA, Act) +labs(title =str_glue("Conventional Outdoor Recreation in {state_chosen}"),subtitle ="by value added in millions of current dollars", caption ="Included are nine broad conventional outdoor recreation activities categorized by the Bureau of Economic Analysis")
The chart above illustrates key trends in conventional outdoor recreation activities across Vermont since 2017. In 2023, “Motorcycling/ATVing” is ranked in number 6 outdoor recreational activity in the state.
ATV Recreation in 2023 across States
Code
map_OR_dollar <- OR_selected %>%get_static_map(variable = OR_VA, var_lab ="Billions of \nDollars") +labs(title ="in Billions of Dollars")
Code
map_OR_pct <- OR_selected %>%get_static_map(variable = pct, var_lab ="Percent") +labs(title ="as Share of State GDP")
Code
map_OR_dollar + map_OR_pct +plot_annotation(title =str_glue('{activity_chosen}: Value Added in {year_chosen}'))
The maps above highlight the significance of Vermont’s ATV/UTV recreation compared to other states. The map on the left presents the industry’s value added in billions of dollars, with large states such as California and Texas prominently standing out.
The map on the right adjusts for state size by showing value added as a percentage of state GDP. This comparison reveals the notable importance of the ATV/UTV recreation in Midwestern states.
map_OR_percent_change + map_OR_diff +plot_annotation(title =str_glue('{activity_chosen}: Value Added during 2019-2023') )
The maps above reveal the growth trajectory of the ATV/UTV recreation in the United States from 2019 to 2023.
Percent Growth Since the Pandemic (Left Map): 45 states experienced industry growth compared to pre-pandemic levels, underscoring a national resurgence. Indiana led with a remarkable 123% growth, while New Mexico saw a -19% growth. This variation highlights how state-level policies, regional demand, and other factors influence industry dynamics.
Growth Adjusted for State Economy (Right Map): To account for differences in overall economic growth, the second map subtracts each state’s GDP growth from the ATV/UTV recreation growth. This adjustment demonstrates that in 27 states, the industry’s growth outpaces general economic expansion, underscoring its robust recovery and increasing economic significance nationwide.
Limitations of BEA ORSA Data
While the BEA Outdoor Recreation Satellite Account (ORSA) provides valuable insights, its statistics have certain limitations in fully capturing the economic impact of the ATV/UTV recreation:
Exclusion of Multi-Purpose Expenditures: Purchases that serve multiple purposes, such as towing trucks used for transporting ATVs, are not included in the statistics. This omission overlooks a significant portion of rider-related spending.
Generalized Tourism Spending: Travel and tourism expenditures, such as hotel stays and restaurant dining, are reported as part of an aggregate total for all outdoor recreation activities. These expenses are not attributed specifically to ATV/UTV activities, diluting the industry’s perceived economic contribution.
Aggregated Reporting Categories: ORSA groups multiple activities into broad categories (e.g., Motorcycling / ATVing), which may obscure the detailed economic contributions of individual segments within the outdoor recreation sector.
Due to these limitations, stakeholders often commission consultants to conduct detailed economic impact studies, offering a more precise understanding of the industry’s role in the economy. Such tailored studies can provide actionable insights for advocacy and policymaking.
“Daniel Lee Consulting: Custom Economic Insights and Data Solutions for Your Distinctive Goals”