Skip to content

Commit e689e08

Browse files
committed
deduplicate argument documentation
1 parent 77ef62c commit e689e08

File tree

2 files changed

+10
-26
lines changed

2 files changed

+10
-26
lines changed

R/theme-elements.R

Lines changed: 5 additions & 12 deletions
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@
1515
#'
1616
#' @param fill Fill colour.
1717
#' @param colour,color Line/border colour. Color is an alias for colour.
18-
#' @param linewidth Line/border size in mm.
18+
#' @param linewidth,borderwidth Line/border size in mm.
1919
#' @param size,fontsize text size in pts.
2020
#' @param arrow.fill Fill colour for arrows.
2121
#' @param inherit.blank Should this element inherit the existence of an
@@ -90,10 +90,10 @@ element_rect <- function(fill = NULL, colour = NULL, linewidth = NULL,
9090

9191
#' @export
9292
#' @rdname element
93-
#' @param linetype Line type. An integer (0:8), a name (blank, solid,
94-
#' dashed, dotted, dotdash, longdash, twodash), or a string with
95-
#' an even number (up to eight) of hexadecimal digits which give the
96-
#' lengths in consecutive positions in the string.
93+
#' @param linetype,bordertype Line type for lines and borders respectively. An
94+
#' integer (0:8), a name (blank, solid, dashed, dotted, dotdash, longdash,
95+
#' twodash), or a string with an even number (up to eight) of hexadecimal
96+
#' digits which give the lengths in consecutive positions in the string.
9797
#' @param lineend Line end Line end style (round, butt, square)
9898
#' @param arrow Arrow specification, as created by [grid::arrow()]
9999
element_line <- function(colour = NULL, linewidth = NULL, linetype = NULL,
@@ -160,13 +160,6 @@ element_text <- function(family = NULL, face = NULL, colour = NULL,
160160
#' @param ink Foreground colour.
161161
#' @param paper Background colour.
162162
#' @param accent Accent colour.
163-
#' @param linewidth,borderwidth Linewidth for plain lines and outlines
164-
#' respectively in mm.
165-
#' @param linetype,bordertype Line type for plain lines and outlines
166-
#' respectively. An integer (0:8), a name (blank, solid,
167-
#' dashed, dotted, dotdash, longdash, twodash), or a string with
168-
#' an even number (up to eight) of hexadecimal digits which give the
169-
#' lengths in consecutive positions in the string.
170163
#' @param pointsize Size for points in mm.
171164
#' @param pointshape Shape for points (1-25).
172165
#' @export

man/element.Rd

Lines changed: 5 additions & 14 deletions
Some generated files are not rendered by default. Learn more about customizing how changed files appear on GitHub.

0 commit comments

Comments
 (0)