Skip to content

Commit

Permalink
delete unnecessary code
Browse files Browse the repository at this point in the history
  • Loading branch information
Yunuuuu committed Aug 12, 2023
1 parent 3a7068b commit 57a5c36
Showing 1 changed file with 0 additions and 1 deletion.
1 change: 0 additions & 1 deletion R/legend-draw.R
Original file line number Diff line number Diff line change
Expand Up @@ -236,7 +236,6 @@ draw_key_smooth <- function(data, params, size) {
#' @export
#' @rdname draw_key
draw_key_text <- function(data, params, size) {
if(is.null(data$label)) data$label <- "a"

textGrob(data$label, 0.5, 0.5,
rot = data$angle %||% 0,
Expand Down

0 comments on commit 57a5c36

Please sign in to comment.