Skip to content

Commit

Permalink
Move towards r-lib release process (#153)
Browse files Browse the repository at this point in the history
  • Loading branch information
hadley authored Jul 2, 2024
1 parent 6df7759 commit e9aa19e
Show file tree
Hide file tree
Showing 2 changed files with 0 additions and 41 deletions.
9 changes: 0 additions & 9 deletions R/utils.R
Original file line number Diff line number Diff line change
Expand Up @@ -3,19 +3,10 @@ drop_nulls <- function(x) {
x[!vapply(x, is.null, logical(1))]
}


# Everything above this function in the stack will be hidden by default in the
# flamegraph.
..stacktraceoff.. <- function(x) x

is_installed <- function(pkg) {
found <- TRUE
tryCatch(utils::packageVersion(pkg),
error = function(e) found <<- FALSE
)
found
}

modal_value0 <- function(x) {
if (!length(x)) {
return(NULL)
Expand Down
32 changes: 0 additions & 32 deletions scripts/release_checks.R

This file was deleted.

0 comments on commit e9aa19e

Please sign in to comment.