Import Data

load("~/OneDrive - Plymouth State University/madness/nmhss_2019_puf_R")

load("~/OneDrive - Plymouth State University/madness/N-MHSS-2010-DS0001-data-r.rda")

rename data sets

treatments_2019 <- PUF
treatments_2010 <- da34945.0001

clean 2019

library(dplyr)
library(tidyr)

treat_cleaned_2019 <- treatments_2019 %>%
  #select treatment variables
  select(starts_with("TREAT")) %>%
  pivot_longer(cols = everything(), names_to = "treatment", values_to = "count") %>%
  #compute percentages  of facilities that offer treatment
  group_by(treatment) %>%
  summarise(percent2019 = mean(count)) %>%
  mutate(treatment = case_when(
    treatment == "TREATPSYCHOTHRPY" ~ "psychotherapy",
    treatment == "TREATFAMTHRPY" ~ "family therapy",
    treatment == "TREATGRPTHRPY" ~ "group therapy",
    treatment == "TREATCOGTHRPY" ~ "cognitive behavioral therapy",
    treatment == "TREATDIALTHRPY" ~ "dialectical behavior therapy",
    treatment == "TREATBEHAVMOD" ~ "behavior modification",
    treatment == "TREATDUALMHSA" ~ "integrated dual disorders treatment",
    treatment == "TREATTRAUMATHRPY" ~ "trauma therapy",
    treatment == "TREATACTVTYTHRPY" ~ "activity therapy",
    treatment == "TREATELECTRO" ~ "electroconvulsive therapy",
    treatment == "TREATTELEMEDINCE" ~ "telemedicine therapy",
    treatment == "TREATPSYCHOMED" ~ "psychotropic medication",
    treatment == "TREATOTH" ~ "mentalhealth treatment approach",
    treatment == "TREATMT" ~ "substanceuse treatment",
    TRUE ~ as.character(treatment)))

treat_cleaned_2019
## # A tibble: 14 x 2
##    treatment                           percent2019
##    <chr>                                     <dbl>
##  1 activity therapy                         0.446 
##  2 behavior modification                    0.660 
##  3 cognitive behavioral therapy             0.902 
##  4 dialectical behavior therapy             0.563 
##  5 integrated dual disorders treatment      0.566 
##  6 electroconvulsive therapy                0.0410
##  7 family therapy                           0.725 
##  8 group therapy                            0.856 
##  9 substanceuse treatment                   0.563 
## 10 mentalhealth treatment approach          0.0585
## 11 psychotropic medication                  0.818 
## 12 psychotherapy                            0.916 
## 13 telemedicine therapy                     0.380 
## 14 trauma therapy                           0.773

clean 2010 data

treat_cleaned_2010 <- treatments_2010 %>%
  select(starts_with("TREAT")) %>%
  pivot_longer(cols = everything(), names_to = "treatment", values_to = "count") %>%
  mutate(count = readr:: parse_number(as.character(count))) %>%
  group_by(treatment) %>%
  summarise(percent2010 = mean(count, na.rm = TRUE)) %>%
  mutate(treatment = case_when(
    treatment == "TREATPSYCHOTHRPY" ~ "psychotherapy",
    treatment == "TREATFAMTHRPY" ~ "family therapy",
    treatment == "TREATGRPTHRPY" ~ "group therapy",
    treatment == "TREATCOGTHRPY" ~ "cognitive behavioral therapy",
    treatment == "TREATDIALTHRPY" ~ "dialectical behavior therapy",
    treatment == "TREATBEHAVMOD" ~ "behavior modification",
    treatment == "TREATDUALMHSA" ~ "integrated dual disorders treatment",
    treatment == "TREATTRAUMATHRPY" ~ "trauma therapy",
    treatment == "TREATACTVTYTHRPY" ~ "activity therapy",
    treatment == "TREATELECTRO" ~ "electroconvulsive therapy",
    treatment == "TREATTELEMEDINCE" ~ "telemedicine therapy",
    treatment == "TREATPSYCHOMED" ~ "psychotropic medication",
    treatment == "TREATOTH" ~ "mentalhealth treatment approach",
    treatment == "TREATMT" ~ "substanceuse treatment",
    TRUE ~ as.character(treatment)))

treat_cleaned_2010
## # A tibble: 11 x 2
##    treatment                           percent2010
##    <chr>                                     <dbl>
##  1 activity therapy                         0.515 
##  2 behavior modification                    0.655 
##  3 cognitive behavioral therapy             0.887 
##  4 integrated dual disorders treatment      0.549 
##  5 electroconvulsive therapy                0.0634
##  6 family therapy                           0.675 
##  7 group therapy                            0.852 
##  8 mentalhealth treatment approach          0.0835
##  9 psychotropic medication                  0.837 
## 10 psychotherapy                            0.863 
## 11 telemedicine therapy                     0.157

Join data

library(stringr)
library(dplyr)
treat <- full_join(treat_cleaned_2010, treat_cleaned_2019) %>%
  mutate(percent2010 = ifelse(is.na(percent2010),0,percent2010),
         treatment = forcats::fct_reorder(treatment,percent2019)) %>%
  pivot_longer(cols = -treatment, names_to = "year", values_to = "percent") %>%
  mutate(year = stringr::str_remove(year, "percent"))

treat
## # A tibble: 28 x 3
##    treatment                           year  percent
##    <fct>                               <chr>   <dbl>
##  1 activity therapy                    2010   0.515 
##  2 activity therapy                    2019   0.446 
##  3 behavior modification               2010   0.655 
##  4 behavior modification               2019   0.660 
##  5 cognitive behavioral therapy        2010   0.887 
##  6 cognitive behavioral therapy        2019   0.902 
##  7 integrated dual disorders treatment 2010   0.549 
##  8 integrated dual disorders treatment 2019   0.566 
##  9 electroconvulsive therapy           2010   0.0634
## 10 electroconvulsive therapy           2019   0.0410
## # … with 18 more rows

Visualize data

library(ggplot2)
library(scales)
ggplot(treat, 
       aes(x = percent, 
           y = treatment,
           fill = year)) +
  geom_bar(stat = "identity", position = "dodge") +
  scale_x_continuous(labels = percent_format())+
  labs(title = "Popular Mental Illness Treatments in the US",
       y = NULL,
       x = "Percent of Facililities",
       caption = "Data Source: SAMHSA, National Mental Health Services Survey")

Looking at the data there wasn’t much of a change from 2010 to 2019 in treatments besides a decrease in activity therapy as well as a decrease electroconvulsive therapy in 2019. Some big changes are some different therapies that were not around in 2010. The first therapy is Trauma therapy, this therapy is used for people that had bad emotional or physical experience. It can be used to treat people with ptsd or people who got into bad accidents. Another is substancuse therapy which is used for people with addictions. You see this used a lot in New Hampshire because of the heroin crisis. The final is dialectical behavior therapy that helps personality disorders. Most of these therapies were made to help stop using drugs. One reason is because of the addiction crisis seen all across the United States. Sometimes drugs are better than therapy methods, for example in our reading there was a point where they talked about someone named Dr. Osheroff. He was sent to Chestnut Lodge to be hospitalized in 1979. Within his seven month stay he happened to get worse. He was treated with psychotherapy four times a week. It did not help him and he developed insomnia. This led to him losing 40 pounds. With no improvement his family sent him to Silver Hill Foundation. He was given medication including anit-depressants and within 3 weeks he showed signs of doing better. After 3 months he was released. This shows how medication can be more useful than therapy depending on the patient’s condition. Based on the data there is less medication being used in 2019 than there was at the time in 2010. This could have a negative effect on the patients. Their recovery could take a lot longer if they use therapy methods versus using medication. Although today our therapists have better studies and our medical technology is more advanced than it was in the 70’s. That could be the reason we are geared towards therapy rather than medication.

work cited

Eghigian, Greg. From Madness to Mental Health : Psychiatric Disorder and Its Treatment in Western Civilization. Rutgers University Press, 2010. EBSCOhost, search.ebscohost.com/login.aspx?direct=true&db=e000xna&AN=439506&site=ehost-live.