R/ggplot_ewing.R

Defines functions plot.ewing autoplot.ewing ggplot_ewing

Documented in autoplot.ewing ggplot_ewing plot.ewing

#' ggplot of Ewing simulation model age classes
#' 
#' GGPlot of various aspects of simulation.
#' 
#' 
#' @aliases ggplot_ewing autoplot.ewing ggplot_ewing_ageclass
#' autoplot.ewing_ageclass
#' @param ... other plot parameters
#' @param x object of class \code{ewing} with population data by species
#' @author Brian S. Yandell, \email{yandell@@stat.wisc.edu}
#' @seealso \code{\link{init.simulation}}, \code{\link{future.events}},
#' \code{\link{summary.ewing}}
#' @references \url{www.stat.wisc.edu/~yandell/ewing}
#' @keywords utilities
#' @examples
#' 
#' 
#' \dontrun{
#' ggplot_ewing( community )
#' }
#' 
#' 
#' @export
#' @importFrom ggplot2 autoplot
ggplot_ewing <- function(object, step = 0, ageclass = TRUE,
                         substrate = !ageclass, ...)
{
  if(!inherits(object, "ewing_snapshot")) {
    object <- ewing_snapshot(object, step, ...)
  }
  step <- object$step
  
  p <- list()
  i <- 0
  if(ageclass) {
    i <- i + 1
    p[[i]] <- ggplot2::autoplot(object$ageclass, ...)
  }
  if(substrate) {
    species <- names(object$substrate)
    for(j in species) {
      i <- i + 1
      p[[i]] <- ggplot2::autoplot(object$substrate[[j]], ...)
    }
  }
  if(length(p) == 1) p <- p[[1]]
  p
}
#' @export
#' @rdname ggplot_ewing
#' @method autoplot ewing
autoplot.ewing <- function(object, ...) {
  ggplot_ewing(object, ...)
}
#' @export
#' @rdname ggplot_ewing
#' @method plot ewing
plot.ewing <- function(x, ...) {
  ggplot_ewing(x, ...)
}
byandell/ewing documentation built on June 11, 2025, 4:53 a.m.