library(agricolae)
library(readr)
genetic_gains <- read_csv("genetic_gains.csv")
## Parsed with column specification:
## cols(
## entry = col_double(),
## hybrid = col_character(),
## years = col_double(),
## average = col_double()
## )
View(genetic_gains)
attach(genetic_gains)
library(ggplot2)
library(maps)
library(ggalt)
## Registered S3 methods overwritten by 'ggalt':
## method from
## grid.draw.absoluteGrob ggplot2
## grobHeight.absoluteGrob ggplot2
## grobWidth.absoluteGrob ggplot2
## grobX.absoluteGrob ggplot2
## grobY.absoluteGrob ggplot2
library(extrafontdb)
library(MASS)
library(pscl)
## Classes and Methods for R developed in the
## Political Science Computational Laboratory
## Department of Political Science
## Stanford University
## Simon Jackman
## hurdle and zeroinfl functions by Achim Zeileis
library(psych)
##
## Attaching package: 'psych'
## The following objects are masked from 'package:ggplot2':
##
## %+%, alpha
library(gridExtra)
library(repr) ### adjusting the length and width of your plot
library(beanplot)
library("devtools")
## Loading required package: usethis
library("yarrr")
## Loading required package: jpeg
## Loading required package: BayesFactor
## Loading required package: coda
## Loading required package: Matrix
## ************
## Welcome to BayesFactor 0.9.12-4.2. If you have questions, please contact Richard Morey (richarddmorey@gmail.com).
##
## Type BFManual() to open the manual.
## ************
## Loading required package: circlize
## ========================================
## circlize version 0.4.6
## CRAN page: https://cran.r-project.org/package=circlize
## Github page: https://github.com/jokergoo/circlize
## Documentation: http://jokergoo.github.io/circlize_book/book/
##
## If you use it in published research, please cite:
## Gu, Z. circlize implements and enhances circular visualization
## in R. Bioinformatics 2014.
## ========================================
## yarrr v0.1.5. Citation info at citation('yarrr'). Package guide at yarrr.guide()
## Email me at Nathaniel.D.Phillips.is@gmail.com
##
## Attaching package: 'yarrr'
## The following object is masked from 'package:ggplot2':
##
## diamonds
library(agricolae)
library(easynls)
ggplot(genetic_gains, aes(x = years, y = average))+
geom_point(size=2) + geom_smooth(method=lm, position = "jitter", level = 0.95)+ylab("Root:shoot ratio") +
xlab("Years")+
geom_abline(xintercept = 0, linetype=2, color = "black", size=1)
## Warning: Ignoring unknown parameters: xintercept

theme_set(theme_gray(base_size=12))
ggplot(genetic_gains, aes(x = years, y = average)) +
geom_point(size=2) + geom_smooth(method=lm, position = "jitter", level = 0.95)+ylab("Root:shoot ratios") +
xlab("Years")+
geom_abline(xintercept = 0, linetype=2, color = "black", size=1) + theme_dark()
## Warning: Ignoring unknown parameters: xintercept
