#When I run below codes, the title “Big fires have gotten more common.” will show.

library(anytime)
library(lubridate)
library(readr)
library(dplyr)
library(ggplot2)
library(readr)
library(tidyverse)
library(naniar)
library(scales)

wildfires<-readr::read_csv("https://raw.githubusercontent.com/BuzzFeedNews/2018-07-wildfire-trends/master/data/calfire_frap.csv") %>%
  
  mutate(plot_date = as.Date(format(alarm_date,"2017-%m-%d")))

wildfires<-wildfires%>%mutate(day=yday(alarm_date))

ggplot(wildfires,aes(day,year_, size=gis_acres))+geom_point(color="Orange", alpha=0.5)+
  ggtitle("Big fires have gotten more common.")+ xlab(NA)+ylab(NA)+
  scale_y_continuous(trans= "reverse", breaks=c(2010,1990,1970,1950))+
    scale_x_continuous(breaks=c(30,60,90,120,150,180,210,240,270,300,330,360),
                       labels=c("Jan", "Feb", "Mar", "Apr", "May", "Jun", "Jul", "Aug", "Sep", "Oct", "Nov", "Dec"))

#However, after adding additional codes to further polish the graph, the title is no longer there anymore…. In addition, is that the right way to add the grey lines highlighted in the original graph for year 1950, 1970, 1990, and 2010? I also noticed lighter grey lines for each year in the original graph. Is there a way to get those lines in as well to get it closer to the original one?

ggplot(wildfires,aes(day,year_, size=gis_acres))+geom_point(color="Orange", alpha=0.5)+
  ggtitle("Big fires have gotten more common.")+ xlab(NA)+ylab(NA)+
  scale_y_continuous(trans= "reverse", breaks=c(2010,1990,1970,1950))+
    scale_x_continuous(breaks=c(30,60,90,120,150,180,210,240,270,300,330,360),
                       labels=c("Jan", "Feb", "Mar", "Apr", "May", "Jun", "Jul", "Aug", "Sep", "Oct", "Nov", "Dec"))+
 theme(panel.background = element_blank(), 
       panel.grid.major = element_blank(), 
       panel.grid.minor = element_blank(), 
       plot.background = element_rect(fill="black"),
       axis.text.x=element_text(size=12, face= "bold", color= "white"),
       axis.text.y=element_text(size=14, face= "bold", color="white"),
       legend.position = "none")+
  geom_hline(yintercept=c(1950,1970, 1990, 2010), color="darkgrey")