Skip to content

Commit

Permalink
R CMD check fixes
Browse files Browse the repository at this point in the history
  • Loading branch information
MichaelChirico committed Oct 20, 2024
1 parent 196eb56 commit 6915b28
Show file tree
Hide file tree
Showing 3 changed files with 8 additions and 7 deletions.
3 changes: 2 additions & 1 deletion .Rbuildignore
Original file line number Diff line number Diff line change
@@ -1,8 +1,9 @@
^\.github$
^\.gitignore
^\.lintr
^\.*\.Rproj$
\.Rproj$
^\.Rproj\.user$
^\.devcontainer$
README.md
^NEWS\.[0-9]+$
^codecov\.yml$
6 changes: 3 additions & 3 deletions R/cache.R
Original file line number Diff line number Diff line change
Expand Up @@ -161,9 +161,9 @@ print.cache<- function(x, all.names=FALSE, pattern, ...){
#' @param ... passed to [hashmap()]
#'
#' @details
#' The result of relative expensive operations [hashmap()], [ramsort()],
#' [ramsortorder()], and [ramorder()] can be stored in a cache in order to
#' avoid multiple excutions. Unless in very specific situations, the
#' The result of relative expensive operations [hashmap()], [bit::ramsort()],
#' [bit::ramsortorder()], and [bit::ramorder()] can be stored in a cache in
#' order to avoid multiple excutions. Unless in very specific situations, the
#' recommended method is `hashsortorder` only.
#'
#' @note
Expand Down
6 changes: 3 additions & 3 deletions man/hashcache.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit 6915b28

Please sign in to comment.