File tree Expand file tree Collapse file tree 1 file changed +21
-23
lines changed Expand file tree Collapse file tree 1 file changed +21
-23
lines changed Original file line number Diff line number Diff line change @@ -44,27 +44,26 @@ form_form <-
44
44
spec = object
45
45
)
46
46
47
- elapsed <- system.time(
48
- res $ fit <- eval_mod(
49
- fit_call ,
50
- capture = control $ verbosity == 0 ,
51
- catch = control $ catch ,
52
- envir = env ,
53
- ...
54
- ),
55
- gcFirst = FALSE
47
+ time <- proc.time()
48
+ res $ fit <- eval_mod(
49
+ fit_call ,
50
+ capture = control $ verbosity == 0 ,
51
+ catch = control $ catch ,
52
+ envir = env ,
53
+ ...
56
54
)
55
+ elapsed <- proc.time() - time
57
56
res $ preproc <- list (y_var = all.vars(rlang :: f_lhs(env $ formula )))
58
57
res $ elapsed <- list (elapsed = elapsed , print = control $ verbosity > 1L )
59
58
60
59
res
61
60
}
62
61
63
- xy_xy <- function (object ,
64
- env ,
65
- control ,
66
- target = " none" ,
67
- ... ,
62
+ xy_xy <- function (object ,
63
+ env ,
64
+ control ,
65
+ target = " none" ,
66
+ ... ,
68
67
call = rlang :: caller_env()) {
69
68
70
69
if (inherits(env $ x , " tbl_spark" ) | inherits(env $ y , " tbl_spark" ))
@@ -97,16 +96,15 @@ xy_xy <- function(object,
97
96
98
97
res <- list (lvl = levels(env $ y ), spec = object )
99
98
100
- elapsed <- system.time(
101
- res $ fit <- eval_mod(
102
- fit_call ,
103
- capture = control $ verbosity == 0 ,
104
- catch = control $ catch ,
105
- envir = env ,
106
- ...
107
- ),
108
- gcFirst = FALSE
99
+ time <- proc.time()
100
+ res $ fit <- eval_mod(
101
+ fit_call ,
102
+ capture = control $ verbosity == 0 ,
103
+ catch = control $ catch ,
104
+ envir = env ,
105
+ ...
109
106
)
107
+ elapsed <- proc.time() - time
110
108
111
109
if (is.atomic(env $ y )) {
112
110
y_name <- character (0 )
You can’t perform that action at this time.
0 commit comments