Skip to content

Commit

Permalink
fix the wrong logic in the prev. commit
Browse files Browse the repository at this point in the history
  • Loading branch information
dmpe committed Mar 29, 2016
1 parent a8d71cc commit 08bd0d2
Show file tree
Hide file tree
Showing 2 changed files with 5 additions and 5 deletions.
2 changes: 1 addition & 1 deletion R/boxes.R
Original file line number Diff line number Diff line change
Expand Up @@ -291,7 +291,7 @@ box <- function(..., title = NULL, footer = NULL, status = NULL,
shiny::icon(collapseIcon))
}

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

Expand Down
8 changes: 4 additions & 4 deletions tests-manual/box.R
Original file line number Diff line number Diff line change
Expand Up @@ -42,13 +42,13 @@ body <- dashboardBody(
choices = c("0%" = 0, "20%" = 20, "40%" = 40, "60%" = 60, "80%" = 80,
"100%" = 100)
),
#boxMenu = boxItem(a(href="https://www.bing.com", "bing it!",
# style = "color: yellow", target = "_blank"),
# downloadButton("svgdown", "download svg")),
boxMenu = boxItem(a(href="https://www.bing.com", "bing it!",
style = "color: yellow", target = "_blank"),
downloadButton("svgdown", "download svg")),
collapsible = FALSE, collapsed = FALSE
),
box(title = "Histogram box title",
status = "info", solidHeader = TRUE, collapsible = FALSE,
status = "info", solidHeader = TRUE, collapsible = T,
boxMenu = boxMenuOutput("menuWrench"),
plotOutput("plot", height = 250)
)
Expand Down

0 comments on commit 08bd0d2

Please sign in to comment.