Skip to content

Commit 08bd0d2

Browse files
committed
fix the wrong logic in the prev. commit
1 parent a8d71cc commit 08bd0d2

File tree

2 files changed

+5
-5
lines changed

2 files changed

+5
-5
lines changed

R/boxes.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -291,7 +291,7 @@ box <- function(..., title = NULL, footer = NULL, status = NULL,
291291
shiny::icon(collapseIcon))
292292
}
293293

294-
if (!is.null(boxMenu)) {
294+
if (!is.null(collapseTag) || !is.null(boxMenu)) {
295295
boxTools <- div(class = "box-tools pull-right", collapseTag, boxMenu)
296296
}
297297

tests-manual/box.R

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -42,13 +42,13 @@ body <- dashboardBody(
4242
choices = c("0%" = 0, "20%" = 20, "40%" = 40, "60%" = 60, "80%" = 80,
4343
"100%" = 100)
4444
),
45-
#boxMenu = boxItem(a(href="https://www.bing.com", "bing it!",
46-
# style = "color: yellow", target = "_blank"),
47-
# downloadButton("svgdown", "download svg")),
45+
boxMenu = boxItem(a(href="https://www.bing.com", "bing it!",
46+
style = "color: yellow", target = "_blank"),
47+
downloadButton("svgdown", "download svg")),
4848
collapsible = FALSE, collapsed = FALSE
4949
),
5050
box(title = "Histogram box title",
51-
status = "info", solidHeader = TRUE, collapsible = FALSE,
51+
status = "info", solidHeader = TRUE, collapsible = T,
5252
boxMenu = boxMenuOutput("menuWrench"),
5353
plotOutput("plot", height = 250)
5454
)

0 commit comments

Comments
 (0)