Skip to content

Commit

Permalink
Use more specific attribute name
Browse files Browse the repository at this point in the history
Co-authored-by: Carson Sievert <[email protected]>
  • Loading branch information
jcheng5 and cpsievert authored Dec 6, 2024
1 parent d4f144d commit 88c2b16
Showing 1 changed file with 2 additions and 2 deletions.
4 changes: 2 additions & 2 deletions R/conditions.R
Original file line number Diff line number Diff line change
Expand Up @@ -131,7 +131,7 @@ captureStackTraces <- function(expr) {
.globals$deepStack <- NULL

getCallStackDigest <- function(callStack, warn = FALSE) {
dg <- attr(callStack, "digest", exact = TRUE)
dg <- attr(callStack, "shiny.stack.digest", exact = TRUE)
if (!is.null(dg)) {
return(dg)
}
Expand All @@ -148,7 +148,7 @@ getCallStackDigest <- function(callStack, warn = FALSE) {
}

saveCallStackDigest <- function(callStack) {
attr(callStack, "digest") <- getCallStackDigest(callStack, warn = FALSE)
attr(callStack, "shiny.stack.digest") <- getCallStackDigest(callStack, warn = FALSE)
callStack
}

Expand Down

0 comments on commit 88c2b16

Please sign in to comment.