Skip to content

Commit

Permalink
improve height constraint in value box row
Browse files Browse the repository at this point in the history
  • Loading branch information
gadenbuie committed Nov 20, 2023
1 parent e271d08 commit fe5d780
Showing 1 changed file with 12 additions and 3 deletions.
15 changes: 12 additions & 3 deletions inst/apps/317-bslib-preset-shiny-dashboard/app.R
Original file line number Diff line number Diff line change
@@ -1,5 +1,6 @@
library(shiny)
library(bslib)
library(htmltools)

options(
sass.cache = FALSE,
Expand Down Expand Up @@ -115,9 +116,17 @@ row_cards <- layout_columns(card_a_nav, card_b)

row_value_boxes <-
layout_columns(
style = "max-height: 200px",
value_box("First", "Thing One", showcase = bsicons::bs_icon("pin-angle-fill")),
value_box("Second", "Thing Two", showcase = bsicons::bs_icon("boombox-fill"))
row_heights = "minmax(100px, 1fr)",
value_box(
"First",
"Thing One",
showcase = bsicons::bs_icon("pin-angle-fill")
),
value_box(
"Second",
"Thing Two",
showcase = bsicons::bs_icon("boombox-fill")
)
)

ui_navbar <- function(enable_dashboard = TRUE) {
Expand Down

0 comments on commit fe5d780

Please sign in to comment.