@@ -75,7 +75,7 @@ mars <-
7575 paste0(" '" , mars_modes , " '" , collapse = " , " ),
7676 call. = FALSE )
7777
78- out <- list (args = args , others = NULL ,
78+ out <- list (args = args , eng_args = NULL ,
7979 mode = mode , method = NULL , engine = NULL )
8080 class(out ) <- make_classes(" mars" )
8181 out
@@ -141,8 +141,8 @@ translate.mars <- function(x, engine = x$engine, ...) {
141141 # If classification is being done, the `glm` options should be used. Check to
142142 # see if it is there and, if not, add the default value.
143143 if (x $ mode == " classification" ) {
144- if (! (" glm" %in% names(x $ others ))) {
145- x $ others $ glm <- quote(list (family = stats :: binomial ))
144+ if (! (" glm" %in% names(x $ eng_args ))) {
145+ x $ eng_args $ glm <- quote(list (family = stats :: binomial ))
146146 }
147147 }
148148
@@ -208,8 +208,8 @@ multi_predict._earth <-
208208 msg <-
209209 paste(" Please use `keepxy = TRUE` as an option to enable submodel" ,
210210 " predictions with `earth`." )
211- if (any(names(object $ spec $ others ) == " keepxy" )) {
212- if (! object $ spec $ others $ keepxy )
211+ if (any(names(object $ spec $ eng_args ) == " keepxy" )) {
212+ if (! object $ spec $ eng_args $ keepxy )
213213 stop (msg , call. = FALSE )
214214 } else
215215 stop (msg , call. = FALSE )
0 commit comments