Skip to content

Commit

Permalink
Provide a default method so as not to break existing code
Browse files Browse the repository at this point in the history
(I'm looking at you quillt:::thumbnails)
  • Loading branch information
cpsievert committed Mar 18, 2021
1 parent d8db18a commit 02b94e8
Show file tree
Hide file tree
Showing 2 changed files with 4 additions and 4 deletions.
4 changes: 2 additions & 2 deletions NAMESPACE
Original file line number Diff line number Diff line change
Expand Up @@ -20,9 +20,9 @@ S3method(print,shiny.tag)
S3method(print,shiny.tag.list)
S3method(tagAppendAttributes,shiny.tag)
S3method(tagAppendAttributes,shiny.tag.function)
S3method(tagAppendChild,shiny.tag)
S3method(tagAppendChild,default)
S3method(tagAppendChild,shiny.tag.function)
S3method(tagAppendChildren,shiny.tag)
S3method(tagAppendChildren,default)
S3method(tagAppendChildren,shiny.tag.function)
S3method(tagSetChildren,shiny.tag)
S3method(tagSetChildren,shiny.tag.function)
Expand Down
4 changes: 2 additions & 2 deletions R/tags.R
Original file line number Diff line number Diff line change
Expand Up @@ -345,7 +345,7 @@ tagAppendChild <- function(tag, child) {
}

#' @export
tagAppendChild.shiny.tag <- function(tag, child) {
tagAppendChild.default <- function(tag, child) {
tag$children[[length(tag$children) + 1]] <- child
tag
}
Expand All @@ -368,7 +368,7 @@ tagAppendChildren <- function(tag, ..., list = NULL) {
}

#' @export
tagAppendChildren.shiny.tag <- function(tag, ..., list = NULL) {
tagAppendChildren.default <- function(tag, ..., list = NULL) {
tag$children <- unname(c(tag$children, c(dots_list(...), list)))
tag
}
Expand Down

0 comments on commit 02b94e8

Please sign in to comment.