Skip to content

Commit c21d39f

Browse files
committed
add new arguments
1 parent 0269b0f commit c21d39f

File tree

2 files changed

+40
-8
lines changed

2 files changed

+40
-8
lines changed

R/theme-sub.R

Lines changed: 18 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -96,10 +96,24 @@ theme_sub_axis_right <- function(title, text, ticks, ticks.length, line, minor.t
9696

9797
#' @export
9898
#' @describeIn subtheme Theme specification for the legend.
99-
theme_sub_legend <- function(background, margin, spacing, spacing.x, spacing.y,
100-
key, key.size, key.height, key.width, text, title,
101-
position, direction, justification, box, box.just,
102-
box.margin, box.background, box.spacing) {
99+
theme_sub_legend <- function(
100+
# Text stuff
101+
text, text.position, title, title.position,
102+
# Drawn elements
103+
background, frame, ticks, ticks.length, axis.line,
104+
# Spacings
105+
spacing, spacing.x, spacing.y, margin,
106+
# Seys
107+
key, key.size, key.height, key.width, key.spacing, key.spacing.x,
108+
key.spacing.y, key.justification,
109+
# Settings
110+
byrow, position, direction, location, position.inside,
111+
# Justification
112+
justification, justification.top, justification.bottom, justification.left,
113+
justification.right, justification.inside,
114+
# Box
115+
box, box.just, box.margin, box.background, box.spacing
116+
) {
103117
subtheme(find_args(), "legend.")
104118
}
105119

man/subtheme.Rd

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

0 commit comments

Comments
 (0)