R/geom_gseaGradient.R

Defines functions geom_gseaGradient

Documented in geom_gseaGradient

#' GSEA color gradient for ggplot2
#'
#' Imports:
#' ggplot2
#'
#' @inheritParams geom_gsea
#' @inheritParams ggplot2::geom_rect
#' @import ggplot2
#'
#' @return a ggplot layer that can be added to a ggplot object
#' @details uses the ggplot2::layer function, with geom="rect"
#' @export
#' @examples
#' library(gggsea)
#' library(ggplot)
#'
#' curve <- gseaCurve(myRankedlist, mySetlist)
#' ggplot() + geom_gseaGradient(curve) + theme_gsea()
#'
geom_gseaGradient <- function(df, ...){

  gseaGradient <- ggplot2::layer(
    data = df,
    mapping = ggplot2::aes(xmin=xGradientStart, ymin=y1gradient, xmax=x, ymax=y2gradient),
    geom = "rect",
    stat = "identity",
    position = "identity",
    show.legend = FALSE,
    inherit.aes = FALSE,
    params=list(...)
  )
  userInput <- names(as.list(match.call())) #get all parameters set by the user
  if(!"size" %in% userInput) gseaGradient$aes_params[["size"]] <- 0.2
  if(!"fill" %in% userInput) gseaGradient$aes_params[["fill"]] <- df$color

  return(gseaGradient)
}
NicolasH2/gggsea documentation built on Jan. 28, 2024, 7:25 p.m.