Skip to content

Commit

Permalink
Apply suggestions from code review
Browse files Browse the repository at this point in the history
  • Loading branch information
cpsievert authored Jul 11, 2023
1 parent 14f3f32 commit 8dcbdbe
Show file tree
Hide file tree
Showing 5 changed files with 5 additions and 5 deletions.
2 changes: 1 addition & 1 deletion R/accordion.R
Original file line number Diff line number Diff line change
Expand Up @@ -280,7 +280,7 @@ check_character <- function(x, max_length = Inf, min_length = 1, call = rlang::c
accordion_dependency <- function() {
list(
component_dependency_js("accordion"),
bslib::bs_dependency_defer(accordion_dependency_sass)
bs_dependency_defer(accordion_dependency_sass)
)
}

Expand Down
2 changes: 1 addition & 1 deletion R/card.R
Original file line number Diff line number Diff line change
Expand Up @@ -283,7 +283,7 @@ full_screen_toggle <- function() {
card_dependency <- function() {
list(
component_dependency_js("card"),
bslib::bs_dependency_defer(card_dependency_sass)
bs_dependency_defer(card_dependency_sass)
)
}

Expand Down
2 changes: 1 addition & 1 deletion R/page.R
Original file line number Diff line number Diff line change
Expand Up @@ -142,7 +142,7 @@ page_sidebar <- function(..., sidebar = NULL, title = NULL, fillable = TRUE, fil
border_radius = FALSE,
...
),
bslib::bs_dependency_defer(page_sidebar_dependency_sass)
bs_dependency_defer(page_sidebar_dependency_sass)
)
}

Expand Down
2 changes: 1 addition & 1 deletion R/sidebar.R
Original file line number Diff line number Diff line change
Expand Up @@ -292,7 +292,7 @@ sidebar_init_js <- function() {
sidebar_dependency <- function() {
list(
component_dependency_js("sidebar"),
bslib::bs_dependency_defer(sidebar_dependency_sass)
bs_dependency_defer(sidebar_dependency_sass)
)
}

Expand Down
2 changes: 1 addition & 1 deletion R/utils-deps.R
Original file line number Diff line number Diff line change
Expand Up @@ -37,7 +37,7 @@ component_dependency_sass_ <- function(theme, name) {
path_components("scss", paste0(name, ".scss"))
)

bslib::bs_dependency(
bs_dependency(
input = lapply(scss_files, sass_file),
theme = theme,
name = paste0("bslib-", name, "-styles"),
Expand Down

0 comments on commit 8dcbdbe

Please sign in to comment.