Skip to content

Commit c722988

Browse files
committed
revert using backports
`isFALSE()` needed at pkg build time.
1 parent 05d357a commit c722988

File tree

3 files changed

+5
-3
lines changed

3 files changed

+5
-3
lines changed

DESCRIPTION

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -38,7 +38,6 @@ Imports:
3838
methods,
3939
R6,
4040
ellipsis,
41-
backports,
4241
rlang
4342
Suggests:
4443
ggplot2,

R/metrics.R

Lines changed: 5 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -104,6 +104,11 @@ NULL
104104
NULL
105105

106106

107+
if(getRversion() < "3.4.2")
108+
isFALSE <- function (x) {
109+
is.logical(x) && length(x) == 1L && !is.na(x) && !x
110+
}
111+
107112
py_metric_wrapper <- function(py_fn, py_cls, formals=NULL, modifiers=NULL,
108113
py_fn_name = TRUE) {
109114
modifiers <- substitute(modifiers)

R/package.R

Lines changed: 0 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -96,8 +96,6 @@ keras <- NULL
9696

9797
.onLoad <- function(libname, pkgname) {
9898

99-
backports::import(pkgname, "isFALSE")
100-
10199
# resolve the implementation module (might be keras proper or might be tensorflow)
102100
implementation_module <- resolve_implementation_module()
103101

0 commit comments

Comments
 (0)