R Markdown

I tried to keep the shape and color the same for each graph to make it easier going from one to the other.

## [1] "Cattle"    "Full-Burn" "Half-Burn" "Sheep"
## [1] "August"    "July"      "June"      "September"
## [1] "Cattle"    "Full-Burn" "Half-Burn" "Sheep"
## [1] "Cattle"    "Full-Burn" "Half-Burn" "Sheep"
## Warning: package 'ggplot2' was built under R version 3.4.2

NIR by month and treatment

ggplot(TM17graphing, aes(x=Month, Y=sim.mean, color=Treatment, shape=Grassland))+
  geom_point(position=position_dodge(0.9), aes(y=sim.mean),size=4.5)+
  geom_hline(yintercept = 0, color="black", linetype="dashed")+
  geom_vline(xintercept = 3.5, color ="darkgrey")+
  geom_vline(xintercept = 2.5, color ="darkgrey")+
  geom_vline(xintercept = 1.5, color ="darkgrey")+
  geom_errorbar(position=position_dodge(0.9), aes(ymin=ci.L, ymax=ci.U),size=2, width=0.2)+
  scale_color_brewer(palette="Set1")+
  scale_fill_brewer(palette="Set1")+
  xlab ("Month")+
  ylab ("Forage Quality (% Difference) + 95 % CI")+
  guides(shape=guide_legend(title="Grassland Type:"), color=guide_legend(title="Treatment:"))+
  theme_bw()+
  theme (axis.text=element_text(size=12, face="bold"),
         #legend.position = c(.5, .88),
         legend.position="bottom",
         panel.grid.minor = element_blank(),
         panel.grid.major = element_blank(),
         axis.title=element_text(size=14, face="bold"), 
         plot.title=element_text(size=12, face="bold", hjust=0.5))+
  facet_grid(Grassland~Variable)

This is the version with the update. I also changed ‘% Change’ to ‘% Difference’. Ben thought it should go that way. I’m fine with either.

VOR

ggplot(VOR, aes(x=Treatment, Y=sim.mean, color=Treatment))+
  geom_point(aes(y=sim.mean, shape=Grassland),size=5)+
  scale_color_brewer(palette="Set1")+
  scale_fill_brewer(palette="Set1")+
  geom_hline(yintercept = 0, color="black", linetype="dashed")+
  geom_errorbar(aes(ymin=ci.L, ymax=ci.U),size=2, width=0.2)+
  coord_cartesian(ylim=c(-100,20))+
  scale_y_continuous(breaks=c(-80,-60,-40,-20,0,20))+
  xlab ("Treatment")+
  ylab ("Vegetative Structure (% Difference) + 95 % CI")+
  guides(shape=guide_legend(title="Grassland:"), color=guide_legend(title="Treatment:"))+
  theme_bw()+
  theme (axis.text=element_text(size=12, face="bold"),
         #legend.position = c(.5, .88),
         legend.position="bottom",
         panel.grid.minor = element_blank(),
         panel.grid.major = element_blank(),
         axis.title=element_text(size=14, face="bold"), 
         plot.title=element_text(size=12, face="bold", hjust=0.5))

Grazer Occupancy

ggplot(GOBioGraphing[order(GOBioGraphing$Order),], aes(x=LBIO, y=LGO, group=Pasture))+
  geom_point(aes(color=Treatment, shape=Grassland), size=4)+
  geom_path(aes(color=Treatment),arrow = arrow(), show.legend = FALSE)+
  scale_color_brewer(palette="Set1")+
  scale_fill_brewer(palette="Set1")+
  geom_hline(aes(yintercept=0), linetype="dashed")+
  geom_vline(aes(xintercept=0), linetype="dashed")+
  xlab ("Forage Biomass [Log (% Difference)]")+
  ylab ("Grazer Occupancy [Log (% Difference)]")+
  guides(shape=guide_legend(title="Grassland Type:"), alpha=FALSE)+
  annotate("text", label = "Grazers Attracted to Burn Patch \n Biomass Lower in Burn Patch", 
           x = -6.2,y = 8, color="black", size = 5)+
  annotate("text", label = "Grazers Attracted to Burn Patch \n Biomass Greater in Burn Patch", 
           x = 6.25,y = 8, color="black", size = 5)+
  annotate("text", label = "Grazers Avoided Burn Patch \n Biomass Lower in Burn Patch", 
           x = -6.3,y = -8, color="black", size = 5)+
  annotate("text", label = "Grazers Avoided Burn Patch \n Biomass Greater in Burn Patch", 
           x = 6.25,y = -8, color="black", size = 5)+
  coord_cartesian(ylim=c(-8,8),xlim=c(-8,8))+
  scale_y_continuous(breaks=c(-8,-6,-4,-2,0,2,4,6,8))+
  scale_x_continuous(breaks=c(-8,-6,-4,-2,0,2,4,6,8))+
  theme_bw()+
  theme (axis.text.x=element_text(angle=0,hjust=.5),
         axis.text=element_text(size=10),
         panel.grid.minor = element_blank(),
         panel.grid.major = element_blank(),
         legend.position = "bottom",
         axis.title=element_text(size=14, face="bold"), 
         plot.title=element_text(size=12, face="bold", hjust=0.5))

This is the code for the one I am using on the poster