Input

  WPAER01 <- read_csv("TWO PAER LA.csv")
  WPAER01 <- select(WPAER01,State,Group,SDID_TE,
                    Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  WPAER01$Group<-as.Date(WPAER01$Group)
  
 
  Plot.AER<-ggplot(WPAER01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPAF01 <- read_csv("TWO PAF LA.csv")
  WPAF01 <- select(WPAF01,State,Group,SDID_TE,
                   Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  WPAF01$Group<-as.Date(WPAF01$Group)
  
  
  Plot.AF<-ggplot(WPAF01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPASW01 <- read_csv("TWO PASW LA.csv")
  #WPASW01 <- select(WPASW01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPASW01$Group<-as.Date(WPASW01$Group)

  Plot.ASW<-ggplot(WPASW01,aes(x=DATE))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPCON01 <- read_csv("TWO PCON LA.csv")
  WPCON01 <- select(WPCON01,State,Group,SDID_TE,
                    Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  WPCON01$Group<-as.Date(WPCON01$Group)
  
  Plot.CON<-ggplot(WPCON01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPES01 <- read_csv("TWO PES LA.csv")
  WPES01 <- select(WPES01,State,Group,SDID_TE,
                   Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  WPES01$Group<-as.Date(WPES01$Group)
  
  Plot.ES<-ggplot(WPES01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPFI01 <- read_csv("TWO PFI LA.csv")
  WPFI01 <- select(WPFI01,State,Group,SDID_TE,
                   Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  WPFI01$Group<-as.Date(WPFI01$Group)
  
  Plot.FI<-ggplot(WPFI01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPGOV01 <- read_csv("TWO PGOV LA.csv")
  #WPGOV01 <- select(WPGOV01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPGOV01$Group<-as.Date(WPGOV01$Group)
  
  Plot.GOV<-ggplot(WPGOV01,aes(x=DATE))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPHCS01 <- read_csv("TWO PHCS LA.csv")
  #WPHCS01 <- select(WPHCS01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPHCS01$Change_EST<-WPHCS01$SDID_TE/WPHCS01$CONTROL
  WPHCS01$Group<-as.Date(WPHCS01$Group)
  
  #WPHCS01$Change_OBS<-(WPHCS01$TRUE_VAL-as.numeric(WPHCS01[3,6]))/as.numeric(WPHCS01[3,6])
  
  Plot.HCS<-ggplot(WPHCS01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+ylab("Health Care \n 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

  ###########################
  
  WPINF01 <- read_csv("TWO PINF LA.csv")
  #WPINF01 <- select(WPINF01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPINF01$Change_EST<-WPINF01$SDID_TE/WPINF01$CONTROL
  WPINF01$Group<-as.Date(WPINF01$Group)
  
  #WPINF01$Change_OBS<-(WPINF01$TRUE_VAL-as.numeric(WPINF01[3,6]))/as.numeric(WPINF01[3,6])
  
  Plot.INF<-ggplot(WPINF01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  
  WPMCE01 <- read_csv("TWO PMCE LA.csv")
  #WPMCE01 <- select(WPMCE01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPMCE01$Change_EST<-WPMCE01$SDID_TE/WPMCE01$CONTROL
  #WPMCE01$Group<-as.Date(WPMCE01$Group)
  
  #WPMCE01$Change_OBS<-(WPMCE01$TRUE_VAL-as.numeric(WPMCE01[3,6]))/as.numeric(WPMCE01[3,6])
  
  Plot.MCE<-ggplot(WPMCE01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+ylab("Management of \n Companies and \n 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

  ###########################
  WPMF01 <- read_csv("TWO PMF LA.csv")
  #WPMF01 <- select(WPMF01,State,Group,SDID_TE,
  #Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPMF01$Change_EST<-WPMF01$SDID_TE/WPMF01$CONTROL
  #WPMF01$Group<-as.Date(WPMF01$Group)
  
  #WPMF01$Change_OBS<-(WPMF01$TRUE_VAL-as.numeric(WPMF01[3,6]))/as.numeric(WPMF01[3,6])
  
  Plot.MF<-ggplot(WPMF01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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.MF

  ###########################
  WPOS01 <- read_csv("TWO POS LA.csv")
  #WPOS01 <- select(WPOS01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPOS01$Change_EST<-WPOS01$SDID_TE/WPOS01$CONTROL
  #WPOS01$Group<-as.Date(WPOS01$Group)
  
  #WPOS01$Change_OBS<-(WPOS01$TRUE_VAL-as.numeric(WPOS01[3,6]))/as.numeric(WPOS01[3,6])
  
  Plot.OS<-ggplot(WPOS01,aes(x=DATE))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  
  WPRE01 <- read_csv("TWO PRE LA.csv")
  #WPRE01 <- select(WPRE01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPRE01$Change_EST<-WPRE01$SDID_TE/WPRE01$CONTROL
  #WPRE01$Group<-as.Date(WPRE01$Group)
  
  #WPRE01$Change_OBS<-(WPRE01$TRUE_VAL-as.numeric(WPRE01[3,6]))/as.numeric(WPRE01[3,6])
  
  Plot.RE<-ggplot(WPRE01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+ylab("Real Estate, \n Rental 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

  ###########################
  
  WPRT01 <- read_csv("TWO PRT LA.csv")
  #WPRT01 <- select(WPRT01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPRT01$Change_EST<-WPRT01$SDID_TE/WPRT01$CONTROL
  #WPRT01$Group<-as.Date(WPRT01$Group)
  
#  WPRT01$Change_OBS<-(WPRT01$TRUE_VAL-as.numeric(WPRT01[3,6]))/as.numeric(WPRT01[3,6])
  
  Plot.RT<-ggplot(WPRT01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+ylab("Retail 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

  ###########################
  
  WPTNF01 <- read_csv("TWO PTNF LA.csv")
  #WPTNF01 <- select(WPTNF01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPTNF01$Change_EST<-WPTNF01$SDID_TE/WPTNF01$CONTROL
  #WPTNF01$Group<-as.Date(WPTNF01$Group)
  
  #WPTNF01$Change_OBS<-(WPTNF01$TRUE_VAL-as.numeric(WPTNF01[3,6]))/as.numeric(WPTNF01[3,6])
  
  Plot.TNF<-ggplot(WPTNF01,aes(x=DATE))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+ylab("Total Non-farm")+
    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

  ###########################
  
  WPTWU01 <- read_csv("TWO PTWU LA.csv")
  #WPTWU01 <- select(WPTWU01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPTWU01$Change_EST<-WPTWU01$SDID_TE/WPTWU01$CONTROL
  #WPTWU01$Group<-as.Date(WPTWU01$Group)
  
  #WPTWU01$Change_OBS<-(WPTWU01$TRUE_VAL-as.numeric(WPTWU01[3,6]))/as.numeric(WPTWU01[3,6])
  
  Plot.TWU<-ggplot(WPTWU01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+ylab("Transportation, \n Warehousing, \n 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

  ###########################
  
  WPWT01 <- read_csv("TWO PWT LA.csv")
  #WPWT01 <- select(WPWT01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPWT01$Change_EST<-WPWT01$SDID_TE/WPWT01$CONTROL
  #WPWT01$Group<-as.Date(WPWT01$Group)
  
  #WPWT01$Change_OBS<-(WPWT01$TRUE_VAL-as.numeric(WPWT01[3,6]))/as.numeric(WPWT01[3,6])
  
  Plot.WT<-ggplot(WPWT01,aes(x=Group))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

  ###########################
  WPSPS01 <- read_csv("TWO PSPS LA.csv")
  #WPSPS01 <- select(WPSPS01,State,Group,SDID_TE,Estimate,CONTROL,TRUE_VAL,Change_OBS,Change_EST)
  #WPSPS01$Change_EST<-WPSPS01$SDID_TE/WPSPS01$CONTROL
  #WPSPS01$Group<-as.Date(WPSPS01$Group)
  
  #WPSPS01$Change_OBS<-(WPSPS01$TRUE_VAL-as.numeric(WPSPS01[3,6]))/as.numeric(WPSPS01[3,6])
  
  Plot.SPS<-ggplot(WPSPS01,aes(x=DATE))+
    geom_line(aes(y=Change_OBS,colour="post-pre estimation"))+
    geom_line(aes(y=Change_EST,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-07-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("Time")+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

Grouping

plot<-ggarrange(Plot.TNF,Plot.GOV,Plot.HCS,
                Plot.AF,Plot.RT,Plot.CON,
                Plot.OS,Plot.ES,Plot.MF,
                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)
plot