Dataset

#Load Ozone Dataset
load("Ozone Data with Region.RData")
combinedAir.final<-df4
combinedAir.final<-arrange(combinedAir.final,MonitorID,Year)

combinedAir.final$USDM.categorical<-factor(combinedAir.final$USDM.categorical,levels=c("NoDrought","ModerateDrought","SevereDrought"))

## Subset Between May 1st to Sep 31st.
combinedAir.final$month<-as.numeric(combinedAir.final$month)

combinedAir.final<-combinedAir.final%>%
  filter(month>=5 & month<=9)

All Region

md2_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =combinedAir.final,
                index = c("MonitorID","Year","month"),
                model = "random")

md2_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =combinedAir.final,
                index = c("MonitorID","Year","month"),
                model = "between")


stargazer(md2_random,md2_fix,type = "text", title = "All Regions", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## All Regions
## =============================================================================
##                                         Dependent Variable: Ozone Max        
##                                 ---------------------------------------------
##                                 Random Effect Model    Fixed Effect Model    
## -----------------------------------------------------------------------------
## USDM.categoricalModerateDrought      2.282***               8.410***         
##                                       (0.019)                (1.125)         
##                                                                              
## USDM.categoricalSevereDrought        2.628***               8.782***         
##                                       (0.027)                (1.402)         
##                                                                              
## elevation                            0.004***               0.004***         
##                                      (0.0003)               (0.0003)         
##                                                                              
## Longitude                            -0.035***                0.019          
##                                       (0.010)                (0.013)         
##                                                                              
## Latitude                             -0.133***               -0.043          
##                                       (0.032)                (0.038)         
##                                                                              
## Constant                             46.105***              46.049***        
##                                       (1.625)                (1.748)         
##                                                                              
## -----------------------------------------------------------------------------
## Model Name                      Random Effect Model    Fixed Effect Model    
## Observations                         3,430,104                1,951          
## R2                                     0.009                  0.208          
## Adjusted R2                            0.009                  0.206          
## F Statistic                        19,097.510***    102.022*** (df = 5; 1945)
## =============================================================================
## Note:                                             *p<0.1; **p<0.05; ***p<0.01

Northeast

ne<- combinedAir.final%>%
  filter(noaa_region=="northeast")

ne_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =ne,
                index = c("MonitorID","Year","month"),
                model = "random")

ne_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =ne,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(ne_random,ne_fix,type = "text", title = "Northeast", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Northeast
## ===========================================================================
##                                        Dependent Variable: Ozone Max       
##                                 -------------------------------------------
##                                 Random Effect Model   Fixed Effect Model   
## ---------------------------------------------------------------------------
## USDM.categoricalModerateDrought      2.137***               -0.274         
##                                       (0.068)               (3.202)        
##                                                                            
## USDM.categoricalSevereDrought        1.512***                2.028         
##                                       (0.297)              (15.143)        
##                                                                            
## elevation                            0.003***               0.003**        
##                                       (0.001)               (0.001)        
##                                                                            
## Longitude                             -0.131                -0.140         
##                                       (0.093)               (0.121)        
##                                                                            
## Latitude                             -2.210***             -2.187***       
##                                       (0.160)               (0.209)        
##                                                                            
## Constant                            125.827***            124.357***       
##                                      (12.626)              (16.555)        
##                                                                            
## ---------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model   
## Observations                          519,759                 283          
## R2                                     0.013                 0.542         
## Adjusted R2                            0.013                 0.534         
## F Statistic                        1,549.647***     65.683*** (df = 5; 277)
## ===========================================================================
## Note:                                           *p<0.1; **p<0.05; ***p<0.01

Northern Rockies

nr<- combinedAir.final%>%
  filter(noaa_region=="northern_rockies")

nr_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =nr,
                index = c("MonitorID","Year","month"),
                model = "random")

nr_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =nr,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(nr_random,nr_fix,type = "text", title = "Northern Rockies", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Northern Rockies
## ==========================================================================
##                                       Dependent Variable: Ozone Max       
##                                 ------------------------------------------
##                                 Random Effect Model   Fixed Effect Model  
## --------------------------------------------------------------------------
## USDM.categoricalModerateDrought      1.044***               1.350         
##                                       (0.070)              (1.409)        
##                                                                           
## USDM.categoricalSevereDrought        1.306***              5.393***       
##                                       (0.107)              (1.710)        
##                                                                           
## elevation                            0.004***              0.005***       
##                                       (0.001)              (0.001)        
##                                                                           
## Longitude                             -0.029                0.088         
##                                       (0.098)              (0.107)        
##                                                                           
## Latitude                             -0.713***            -0.552***       
##                                       (0.160)              (0.169)        
##                                                                           
## Constant                             68.936***            72.630***       
##                                       (7.347)              (7.983)        
##                                                                           
## --------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model  
## Observations                          101,196                 93          
## R2                                     0.065                0.740         
## Adjusted R2                            0.065                0.725         
## F Statistic                         542.077***      49.592*** (df = 5; 87)
## ==========================================================================
## Note:                                          *p<0.1; **p<0.05; ***p<0.01

Northwest

nw<- combinedAir.final%>%
  filter(noaa_region=="northwest")

nw_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =nw,
                index = c("MonitorID","Year","month"),
                model = "random")

nw_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =nw,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(nw_random,nw_fix,type = "text", title = "Northwest", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Northwest
## ==========================================================================
##                                       Dependent Variable: Ozone Max       
##                                 ------------------------------------------
##                                 Random Effect Model   Fixed Effect Model  
## --------------------------------------------------------------------------
## USDM.categoricalModerateDrought      0.300***               3.872*        
##                                       (0.090)              (2.238)        
##                                                                           
## USDM.categoricalSevereDrought         -0.117                5.758         
##                                       (0.215)              (6.890)        
##                                                                           
## elevation                             0.002**              0.002**        
##                                       (0.001)              (0.001)        
##                                                                           
## Longitude                            1.403***              1.321***       
##                                       (0.187)              (0.204)        
##                                                                           
## Latitude                             -1.372***            -1.126***       
##                                       (0.264)              (0.311)        
##                                                                           
## Constant                            270.039***            247.469***      
##                                      (22.520)              (26.844)       
##                                                                           
## --------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model  
## Observations                          79,052                  58          
## R2                                     0.021                0.796         
## Adjusted R2                            0.021                0.776         
## F Statistic                         239.747***      40.535*** (df = 5; 52)
## ==========================================================================
## Note:                                          *p<0.1; **p<0.05; ***p<0.01

Ohio Valley

ohv<- combinedAir.final%>%
  filter(noaa_region=="ohio_valley")

ohv_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =ohv,
                index = c("MonitorID","Year","month"),
                model = "random")

ohv_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =ohv,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(ohv_random,ohv_fix,type = "text", title = "Ohio Valley", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Ohio Valley
## ===========================================================================
##                                        Dependent Variable: Ozone Max       
##                                 -------------------------------------------
##                                 Random Effect Model   Fixed Effect Model   
## ---------------------------------------------------------------------------
## USDM.categoricalModerateDrought      3.760***              11.410***       
##                                       (0.054)               (2.220)        
##                                                                            
## USDM.categoricalSevereDrought        6.475***               -4.937         
##                                       (0.123)               (9.285)        
##                                                                            
## elevation                             -0.001                0.0001         
##                                       (0.001)               (0.002)        
##                                                                            
## Longitude                            0.185***              0.184***        
##                                       (0.047)               (0.068)        
##                                                                            
## Latitude                             -0.792***             -0.723***       
##                                       (0.079)               (0.115)        
##                                                                            
## Constant                             94.784***             90.957***       
##                                       (5.615)               (7.608)        
##                                                                            
## ---------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model   
## Observations                          628,182                 339          
## R2                                     0.028                 0.232         
## Adjusted R2                            0.028                 0.220         
## F Statistic                        7,258.624***     20.090*** (df = 5; 333)
## ===========================================================================
## Note:                                           *p<0.1; **p<0.05; ***p<0.01

South

sth<- combinedAir.final%>%
  filter(noaa_region=="south")

sth_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =sth,
                index = c("MonitorID","Year","month"),
                model = "random")

sth_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =sth,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(sth_random,sth_fix,type = "text", title = "South", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## South
## ===========================================================================
##                                        Dependent Variable: Ozone Max       
##                                 -------------------------------------------
##                                 Random Effect Model   Fixed Effect Model   
## ---------------------------------------------------------------------------
## USDM.categoricalModerateDrought      2.693***                2.207         
##                                       (0.057)               (2.337)        
##                                                                            
## USDM.categoricalSevereDrought        4.083***               -2.963         
##                                       (0.078)               (2.749)        
##                                                                            
## elevation                            0.006***              0.006***        
##                                       (0.002)               (0.002)        
##                                                                            
## Longitude                              0.081                 0.044         
##                                       (0.104)               (0.145)        
##                                                                            
## Latitude                             1.123***              1.040***        
##                                       (0.090)               (0.118)        
##                                                                            
## Constant                              13.811                13.722         
##                                      (10.955)              (14.840)        
##                                                                            
## ---------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model   
## Observations                          413,667                 236          
## R2                                     0.021                 0.432         
## Adjusted R2                            0.021                 0.420         
## F Statistic                        4,391.087***     34.979*** (df = 5; 230)
## ===========================================================================
## Note:                                           *p<0.1; **p<0.05; ***p<0.01

Southeast

se<- combinedAir.final%>%
  filter(noaa_region=="southeast")

se_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =se,
                index = c("MonitorID","Year","month"),
                model = "random")

se_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =se,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(se_random,se_fix,type = "text", title = "Southeast", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Southeast
## ============================================================================
##                                        Dependent Variable: Ozone Max        
##                                 --------------------------------------------
##                                 Random Effect Model    Fixed Effect Model   
## ----------------------------------------------------------------------------
## USDM.categoricalModerateDrought      5.449***                3.391          
##                                       (0.049)               (2.155)         
##                                                                             
## USDM.categoricalSevereDrought        7.936***              27.666***        
##                                       (0.069)               (3.003)         
##                                                                             
## elevation                              0.001                 0.0001         
##                                       (0.001)               (0.001)         
##                                                                             
## Longitude                            -0.270***               -0.132         
##                                       (0.068)               (0.081)         
##                                                                             
## Latitude                             1.523***               1.530***        
##                                       (0.062)               (0.071)         
##                                                                             
## Constant                            -30.489***             -20.664***       
##                                       (6.663)               (7.720)         
##                                                                             
## ----------------------------------------------------------------------------
## Model Name                      Random Effect Model    Fixed Effect Model   
## Observations                          530,095                 272           
## R2                                     0.049                 0.735          
## Adjusted R2                            0.049                 0.730          
## F Statistic                        22,787.220***    147.870*** (df = 5; 266)
## ============================================================================
## Note:                                            *p<0.1; **p<0.05; ***p<0.01

Southwest

sw<- combinedAir.final%>%
  filter(noaa_region=="southwest")

sw_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =sw,
                index = c("MonitorID","Year","month"),
                model = "random")

sw_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =sw,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(sw_random,sw_fix,type = "text", title = "Southwest", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Southwest
## ==========================================================================
##                                       Dependent Variable: Ozone Max       
##                                 ------------------------------------------
##                                 Random Effect Model   Fixed Effect Model  
## --------------------------------------------------------------------------
## USDM.categoricalModerateDrought      0.875***              4.751***       
##                                       (0.041)              (1.531)        
##                                                                           
## USDM.categoricalSevereDrought        2.315***               -0.093        
##                                       (0.046)              (1.691)        
##                                                                           
## elevation                             0.001*                0.001         
##                                      (0.0004)              (0.0005)       
##                                                                           
## Longitude                            -0.250***             -0.213*        
##                                       (0.085)              (0.115)        
##                                                                           
## Latitude                              0.161**               0.056         
##                                       (0.079)              (0.104)        
##                                                                           
## Constant                              18.550*              25.610**       
##                                       (9.681)              (12.294)       
##                                                                           
## --------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model  
## Observations                          325,309                222          
## R2                                     0.035                0.096         
## Adjusted R2                            0.035                0.075         
## F Statistic                        2,505.354***     4.569*** (df = 5; 216)
## ==========================================================================
## Note:                                          *p<0.1; **p<0.05; ***p<0.01

Upper Midwest

um<- combinedAir.final%>%
  filter(noaa_region=="upper_midwest")

um_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =um,
                index = c("MonitorID","Year","month"),
                model = "random")

um_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =um,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(um_random,um_fix,type = "text", title = "Upper Midwest", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## Upper Midwest
## ===========================================================================
##                                        Dependent Variable: Ozone Max       
##                                 -------------------------------------------
##                                 Random Effect Model   Fixed Effect Model   
## ---------------------------------------------------------------------------
## USDM.categoricalModerateDrought      1.191***               -5.924         
##                                       (0.080)               (3.643)        
##                                                                            
## USDM.categoricalSevereDrought        2.201***               -3.001         
##                                       (0.247)              (17.562)        
##                                                                            
## elevation                             -0.004                -0.002         
##                                       (0.004)               (0.004)        
##                                                                            
## Longitude                            0.256***              0.235***        
##                                       (0.068)               (0.085)        
##                                                                            
## Latitude                             -1.215***             -1.153***       
##                                       (0.153)               (0.183)        
##                                                                            
## Constant                            120.037***            115.855***       
##                                       (8.450)              (10.214)        
##                                                                            
## ---------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model   
## Observations                          265,885                 128          
## R2                                     0.012                 0.453         
## Adjusted R2                            0.012                 0.430         
## F Statistic                         428.342***      20.190*** (df = 5; 122)
## ===========================================================================
## Note:                                           *p<0.1; **p<0.05; ***p<0.01

West

wst<- combinedAir.final%>%
  filter(noaa_region=="upper_midwest")

wst_random<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =wst,
                index = c("MonitorID","Year","month"),
                model = "random")

wst_fix<-plm(Max.Ozone~USDM.categorical +elevation+ Longitude + Latitude,
                data =wst,
                index = c("MonitorID","Year","month"),
                model = "between")

stargazer(wst_random,wst_fix,type = "text", title = "West", align = TRUE,
  add.lines = list(c("Model Name", "Random Effect Model", "Fixed Effect Model")),
  column.labels = c("Random Effect Model", "Fixed Effect Model"),
  dep.var.caption = "Dependent Variable: Ozone Max",
  dep.var.labels.include = FALSE,
  omit.table.layout = "#")
## 
## West
## ===========================================================================
##                                        Dependent Variable: Ozone Max       
##                                 -------------------------------------------
##                                 Random Effect Model   Fixed Effect Model   
## ---------------------------------------------------------------------------
## USDM.categoricalModerateDrought      1.191***               -5.924         
##                                       (0.080)               (3.643)        
##                                                                            
## USDM.categoricalSevereDrought        2.201***               -3.001         
##                                       (0.247)              (17.562)        
##                                                                            
## elevation                             -0.004                -0.002         
##                                       (0.004)               (0.004)        
##                                                                            
## Longitude                            0.256***              0.235***        
##                                       (0.068)               (0.085)        
##                                                                            
## Latitude                             -1.215***             -1.153***       
##                                       (0.153)               (0.183)        
##                                                                            
## Constant                            120.037***            115.855***       
##                                       (8.450)              (10.214)        
##                                                                            
## ---------------------------------------------------------------------------
## Model Name                      Random Effect Model   Fixed Effect Model   
## Observations                          265,885                 128          
## R2                                     0.012                 0.453         
## Adjusted R2                            0.012                 0.430         
## F Statistic                         428.342***      20.190*** (df = 5; 122)
## ===========================================================================
## Note:                                           *p<0.1; **p<0.05; ***p<0.01