Skip to content

Commit

Permalink
Fix docs
Browse files Browse the repository at this point in the history
  • Loading branch information
thomasp85 committed May 29, 2024
1 parent db8a58a commit a27ac69
Show file tree
Hide file tree
Showing 7 changed files with 18 additions and 8 deletions.
3 changes: 3 additions & 0 deletions R/element_marquee.R
Original file line number Diff line number Diff line change
Expand Up @@ -20,6 +20,9 @@
#' caveats for this
#' @inheritParams ggplot2::element_text
#'
#' @return An `element_marquee` object that can be used in place of
#' `element_text` in ggplot2 theme specifications
#'
#' @export
#'
#' @examplesIf utils::packageVersion("base") > "4.3" && rlang::is_installed("ggplot2")
Expand Down
7 changes: 4 additions & 3 deletions R/geom_marquee.R
Original file line number Diff line number Diff line change
Expand Up @@ -9,6 +9,8 @@
#'
#' @inheritParams ggplot2::geom_text
#'
#' @return A ggplot2 layer that can be added to a plot
#'
#' @details
#' Styling of the text is based on a style set with the exception that the
#' standard aesthetics such as family, size, colour, fill, etc. are recognized
Expand Down Expand Up @@ -74,9 +76,7 @@ geom_marquee <- function(mapping = NULL, data = NULL, stat = "identity",

#' Geom class for geom_marquee
#'
#' This environment contains the Geom needed for [geom_marquee()] in the `geom`
#' variable. It is set up like this to avoid ggplot2 to be a hard dependency of
#' marquee
#' This is the underlying Geom class that powers [geom_marquee()] layers.
#'
#' @usage
#' GeomMarquee
Expand All @@ -86,6 +86,7 @@ geom_marquee <- function(mapping = NULL, data = NULL, stat = "identity",
#' @export GeomMarquee
#'
#' @keywords internal
#' @docType class
#'
NULL

Expand Down
2 changes: 1 addition & 1 deletion R/style_set.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@
#' @param tag The name of a tag to modify or remove. Tags are internally all
#' lowercase and `tag` will be converted to lowercase before matching
#'
#' @return A style set object
#' @return A `marquee_style_set` object
#'
#' @export
#'
Expand Down
5 changes: 2 additions & 3 deletions man/GeomMarquee.Rd

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

4 changes: 4 additions & 0 deletions man/element_marquee.Rd

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

3 changes: 3 additions & 0 deletions man/geom_marquee.Rd

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

2 changes: 1 addition & 1 deletion man/style_set.Rd

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

0 comments on commit a27ac69

Please sign in to comment.