Skip to content

Commit

Permalink
Export rtools_needed
Browse files Browse the repository at this point in the history
Fixes #97
  • Loading branch information
jimhester committed Jun 12, 2020
1 parent 609321c commit 3e3611d
Show file tree
Hide file tree
Showing 2 changed files with 16 additions and 0 deletions.
4 changes: 4 additions & 0 deletions R/rtools.R
Original file line number Diff line number Diff line change
Expand Up @@ -188,6 +188,10 @@ rtools <- function(path, version, ...) {
}
is.rtools <- function(x) inherits(x, "rtools")

#' Retrieve a text string with the rtools version needed
#'
#' @keywords internal
#' @export
rtools_needed <- function() {
r_version <- getRversion()

Expand Down
12 changes: 12 additions & 0 deletions man/rtools_needed.Rd

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

0 comments on commit 3e3611d

Please sign in to comment.