Single Plot

LA_MTNF_Change2015 <- read.csv("TWO TNF LA2.csv")
LA_MTNF_Change2015<-select(LA_MTNF_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.TNF<-ggplot(LA_MTNF_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Total\n Nonfarm")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
  #annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.TNF

#####################
LA_MAER_Change2015 <- read.csv("TWO AER LA2.csv")
LA_MAER_Change2015<-select(LA_MAER_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.AER<-ggplot(LA_MAER_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Arts, Entertainment,\n and Recreation")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.AER

#####################
LA_MAF_Change2015 <- read.csv("TWO AF LA2.csv")
LA_MAF_Change2015<-select(LA_MAF_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.AF<-ggplot(LA_MAF_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Accommodation and \n Food Services")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.AF

#####################
LA_MASW_Change2015 <- read.csv("TWO ASW LA2.csv")
LA_MASW_Change2015<-select(LA_MASW_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.ASW<-ggplot(LA_MASW_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("ASW")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.ASW

#####################
LA_MCON_Change2015 <- read.csv("TWO CON LA2.csv")
LA_MCON_Change2015<-select(LA_MCON_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.CON<-ggplot(LA_MCON_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Construction")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.CON

#####################
LA_MES_Change2015 <- read.csv("TWO ES LA2.csv")
LA_MES_Change2015<-select(LA_MES_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.ES<-ggplot(LA_MES_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Educational \n Services")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.ES

#####################
LA_MFI_Change2015 <- read.csv("TWO FI LA2.csv")
LA_MFI_Change2015<-select(LA_MFI_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.FI<-ggplot(LA_MFI_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Financial \n Insurance")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.FI

#####################
LA_MGOV_Change2015 <- read.csv("TWO GOV LA2.csv")
LA_MGOV_Change2015<-select(LA_MGOV_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.GOV<-ggplot(LA_MGOV_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Government")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.GOV

#####################
LA_MHCS_Change2015 <- read.csv("TWO HCS LA2.csv")
LA_MHCS_Change2015<-select(LA_MHCS_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.HCS<-ggplot(LA_MHCS_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Health Care and \n Social Assistance")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.HCS

#####################
LA_MINF_Change2015 <- read.csv("TWO INF LA2.csv")
LA_MINF_Change2015<-select(LA_MINF_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.INF<-ggplot(LA_MINF_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Information")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.INF

#####################
LA_MMCE_Change2015 <- read.csv("TWO MCE LA2.csv")
LA_MMCE_Change2015<-select(LA_MMCE_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.MCE<-ggplot(LA_MMCE_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Management of Companies \n and Enterprises")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.MCE

#####################
LA_MMAN_Change2015 <- read.csv("TWO MAN LA2.csv")
LA_MMAN_Change2015<-select(LA_MMAN_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.MAN<-ggplot(LA_MMAN_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Manufacturing")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.MAN

#####################
LA_MOS_Change2015 <- read.csv("TWO OS LA2.csv")
LA_MOS_Change2015<-select(LA_MOS_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.OS<-ggplot(LA_MOS_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Other \n Services")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.OS

#####################
LA_MRE_Change2015 <- read.csv("TWO RE LA2.csv")
LA_MRE_Change2015<-select(LA_MRE_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.RE<-ggplot(LA_MRE_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Real Estate, Rental \n and Leasing")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.RE

#####################
LA_MRT_Change2015 <- read.csv("TWO RT LA2.csv")
LA_MRT_Change2015<-select(LA_MRT_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.RT<-ggplot(LA_MRT_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Retail \n Trade")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.RT

#####################
LA_MTWU_Change2015 <- read.csv("TWO TWU LA2.csv")
LA_MTWU_Change2015<-select(LA_MTWU_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)

Plot.TWU<-ggplot(LA_MTWU_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Transportation, \n Warehousing, and Utilities")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.TWU

#####################
LA_MWT_Change2015 <- read.csv("TWO WT LA2.csv")
LA_MWT_Change2015<-select(LA_MWT_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.WT<-ggplot(LA_MWT_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Wholesale \n Trade")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.WT

################################
LA_MSPS_Change2015 <- read.csv("TWO SPS LA2.csv")
LA_MSPS_Change2015<-select(LA_MSPS_Change2015,State,DATE,TRUE_VAL,Change_OBS,Change_EST1)


Plot.SPS<-ggplot(LA_MSPS_Change2015,aes(x=as.Date(DATE)))+geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
  geom_line(aes(y=Change_EST1,colour="SDID estimation"))+
  scale_colour_manual("",breaks = c("post-pre estimation","SDID estimation"),values = c("red","Sky blue"))+
  theme_bw()+geom_hline(yintercept = 0,linetype=2)+geom_vline(xintercept = as.Date("2005-08-01"),linetype="dotdash")+
  theme(legend.position = c(0.12,0.8),legend.background = element_blank(),
        axis.text = element_text(size = 9),axis.title = element_text(size=7))+
  xlab("Year")+ylab("Professional,Scientific, \n and Technical Services")+scale_y_continuous(labels = scales::percent_format(accuracy =1))#+
#annotate("rect", xmin = as.Date("2005-09-01"), xmax = as.Date("2008-01-01"), ymin = -Inf, ymax = Inf, alpha = .4, fill = "gray")

Plot.SPS

Append All Graph

plot2<-ggarrange(Plot.TNF,Plot.GOV,Plot.HCS,
                Plot.AF,Plot.RT,Plot.CON,
                Plot.OS,Plot.ES,Plot.MAN,
                Plot.ASW,Plot.AER,Plot.TWU,
                Plot.WT,Plot.FI,Plot.INF,
                Plot.RE,Plot.MCE,Plot.SPS,
                nrow = 6,ncol = 3,legend = "bottom",common.legend = TRUE)
plot2