Skip to content

Commit

Permalink
fix: Remove |> syntax, add clarifying comment
Browse files Browse the repository at this point in the history
  • Loading branch information
gadenbuie committed Dec 9, 2024
1 parent d0110bb commit a45954c
Showing 1 changed file with 2 additions and 1 deletion.
3 changes: 2 additions & 1 deletion R/bs-theme-preset-brand.R
Original file line number Diff line number Diff line change
Expand Up @@ -265,7 +265,8 @@ brand_font_bunny <- function(family, weight = NULL, style = NULL, display = NULL

values <- character(0)
if (length(weight_list) > 0 && length(ital) > 0) {
values <- outer(weight_list, ital, paste0) |> as.vector()
# 400,700,400i,700i
values <- as.vector(outer(weight_list, ital, paste0))
} else if (length(weight_list) > 0) {
values <- weight_list
} else if (length(ital) > 0) {
Expand Down

0 comments on commit a45954c

Please sign in to comment.