Skip to content

Commit b498734

Browse files
committed
rename part_margin() to margin_part()
1 parent ad51647 commit b498734

File tree

3 files changed

+4
-4
lines changed

3 files changed

+4
-4
lines changed

NAMESPACE

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -485,6 +485,7 @@ export(layer_sf)
485485
export(lims)
486486
export(map_data)
487487
export(margin)
488+
export(margin_part)
488489
export(max_height)
489490
export(max_width)
490491
export(mean_cl_boot)
@@ -497,7 +498,6 @@ export(new_guide)
497498
export(old_guide)
498499
export(panel_cols)
499500
export(panel_rows)
500-
export(part_margin)
501501
export(pattern_alpha)
502502
export(position_dodge)
503503
export(position_dodge2)

R/margins.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -11,7 +11,7 @@ margin <- function(t = 0, r = 0, b = 0, l = 0, unit = "pt") {
1111

1212
#' @rdname element
1313
#' @export
14-
part_margin <- function(t = NA, r = NA, b = NA, l = NA, unit = "pt") {
14+
margin_part <- function(t = NA, r = NA, b = NA, l = NA, unit = "pt") {
1515
margin(t = t, r = r, b = b, l = l, unit = unit)
1616
}
1717

man/element.Rd

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

0 commit comments

Comments
 (0)