Skip to content

Commit

Permalink
Redocument with roxygen2 7.3.1
Browse files Browse the repository at this point in the history
  • Loading branch information
olivroy committed Feb 21, 2024
1 parent 15018cb commit 35b39ce
Show file tree
Hide file tree
Showing 3 changed files with 4 additions and 4 deletions.
2 changes: 1 addition & 1 deletion DESCRIPTION
Original file line number Diff line number Diff line change
Expand Up @@ -41,4 +41,4 @@ Config/Needs/website: tidyverse/tidytemplate
Config/testthat/edition: 3
Encoding: UTF-8
Roxygen: list(markdown = TRUE)
RoxygenNote: 7.2.3
RoxygenNote: 7.3.1
4 changes: 2 additions & 2 deletions R/autoplot.R
Original file line number Diff line number Diff line change
Expand Up @@ -10,7 +10,7 @@
#' @param ... Additional arguments passed to the plotting geom.
#' @details This function requires some optional dependencies. [ggplot2][ggplot2::ggplot2-package],
#' [tidyr][tidyr::tidyr-package], and depending on the plot type
#' [ggbeeswarm][ggbeeswarm::ggbeeswarm], [ggridges][ggridges::ggridges].
#' [ggbeeswarm][ggbeeswarm::ggbeeswarm], [ggridges][ggridges::ggridges-package].
#'
#' For `type` of `beeswarm` and `jitter` the points are colored by the highest
#' level garbage collection performed during each iteration.
Expand Down Expand Up @@ -51,7 +51,7 @@ autoplot.bench_mark <- function(object,
if (!(requireNamespace("ggplot2") && requireNamespace("tidyr"))) {
stop("`ggplot2` and `tidyr` must be installed to use `autoplot`.", call. = FALSE)
}

type <- match.arg(type)

if (type == "beeswarm" && !requireNamespace("ggbeeswarm", quietly = TRUE)) {
Expand Down
2 changes: 1 addition & 1 deletion man/autoplot.bench_mark.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 35b39ce

Please sign in to comment.