Skip to content

Commit

Permalink
deduplicate argument documentation
Browse files Browse the repository at this point in the history
  • Loading branch information
teunbrand committed Aug 27, 2024
1 parent 77ef62c commit e689e08
Show file tree
Hide file tree
Showing 2 changed files with 10 additions and 26 deletions.
17 changes: 5 additions & 12 deletions R/theme-elements.R
Original file line number Diff line number Diff line change
Expand Up @@ -15,7 +15,7 @@
#'
#' @param fill Fill colour.
#' @param colour,color Line/border colour. Color is an alias for colour.
#' @param linewidth Line/border size in mm.
#' @param linewidth,borderwidth Line/border size in mm.
#' @param size,fontsize text size in pts.
#' @param arrow.fill Fill colour for arrows.
#' @param inherit.blank Should this element inherit the existence of an
Expand Down Expand Up @@ -90,10 +90,10 @@ element_rect <- function(fill = NULL, colour = NULL, linewidth = NULL,

#' @export
#' @rdname element
#' @param linetype Line type. An integer (0:8), a name (blank, solid,
#' dashed, dotted, dotdash, longdash, twodash), or a string with
#' an even number (up to eight) of hexadecimal digits which give the
#' lengths in consecutive positions in the string.
#' @param linetype,bordertype Line type for lines and borders respectively. An
#' integer (0:8), a name (blank, solid, dashed, dotted, dotdash, longdash,
#' twodash), or a string with an even number (up to eight) of hexadecimal
#' digits which give the lengths in consecutive positions in the string.
#' @param lineend Line end Line end style (round, butt, square)
#' @param arrow Arrow specification, as created by [grid::arrow()]
element_line <- function(colour = NULL, linewidth = NULL, linetype = NULL,
Expand Down Expand Up @@ -160,13 +160,6 @@ element_text <- function(family = NULL, face = NULL, colour = NULL,
#' @param ink Foreground colour.
#' @param paper Background colour.
#' @param accent Accent colour.
#' @param linewidth,borderwidth Linewidth for plain lines and outlines
#' respectively in mm.
#' @param linetype,bordertype Line type for plain lines and outlines
#' respectively. An integer (0:8), a name (blank, solid,
#' dashed, dotted, dotdash, longdash, twodash), or a string with
#' an even number (up to eight) of hexadecimal digits which give the
#' lengths in consecutive positions in the string.
#' @param pointsize Size for points in mm.
#' @param pointshape Shape for points (1-25).
#' @export
Expand Down
19 changes: 5 additions & 14 deletions man/element.Rd

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

0 comments on commit e689e08

Please sign in to comment.