R/plot_sim.R

Defines functions plot_sim

Documented in plot_sim

#' Plot rejections
#'
#' This is a wrapper function for plotting rejections from iterate for a power analysis
#'
#' @param dat A csv file containing data to plot
#' @param legend Legend position; passed to legend.postion()
#'
#' @export
#'

plot_sim <- function(dat, legend = c("none", "top", "bottom", "left", "right")){
  cols <- c("FET" = "#f04546", "PDT" = "#3591d1", "ZTNBDT" = "#62c76b")
  MAs <- rbind(NA, NA, NA, NA,
               as.data.frame(sapply(dat, FUN = function(x) zoo::rollmean(x, k = 9))),
               NA, NA, NA, NA)
  library(ggplot2)
  ggplot(data = na.omit(dat), aes(x = seq(10, 1000, by = 10))) +
    geom_line(aes(y = V1, color = names(cols)[1]), alpha = .5) +
    geom_line(aes(y = MAs$V1, color = names(cols)[1])) +
    geom_line(aes(y = V2, color = names(cols)[2]), alpha = .5) +
    geom_line(aes(y = MAs$V2, color = names(cols)[2])) +
    geom_line(aes(y = V3, color = names(cols)[3]), alpha = .5) +
    geom_line(aes(y = MAs$V3, color = names(cols)[3])) +
    ylab("Rejection Rate") + xlab(bquote(paste(nu, " (nu)"))) +
    scale_colour_manual(name = "Hypothesis Test", values = cols) +
    theme_bw() +
    theme(legend.position = legend)
}
chrisroberts2112/msProject documentation built on April 21, 2022, 1:59 a.m.