aq.dt <- as.data.frame(airquality)
aov1 <- aov(Ozone ~ Month, data = aq.dt)
summary(aov1)
##              Df Sum Sq Mean Sq F value Pr(>F)  
## Month         1   3387    3387   3.171 0.0776 .
## Residuals   114 121756    1068                 
## ---
## Signif. codes:  0 '***' 0.001 '**' 0.01 '*' 0.05 '.' 0.1 ' ' 1
## 37 observations deleted due to missingness
#Because the Pr(>F) is greater than .05 we can conclude that there is little statistical significance. If this test was significant a you could perfrom a Tukey test.