Skip to content

Commit 6e0db90

Browse files
author
Sigrid Keydana
committed
depth_multiplier was removed
1 parent 632cb84 commit 6e0db90

File tree

1 file changed

+1
-2
lines changed

1 file changed

+1
-2
lines changed

R/applications.R

Lines changed: 1 addition & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -435,13 +435,12 @@ mobilenet_load_model_hdf5 <- function(filepath) {
435435
#' @seealso application_mobilenet
436436
#'
437437
#' @export
438-
application_mobilenet_v2 <- function(input_shape = NULL, alpha = 1.0, depth_multiplier = 1, include_top = TRUE,
438+
application_mobilenet_v2 <- function(input_shape = NULL, alpha = 1.0, include_top = TRUE,
439439
weights = "imagenet", input_tensor = NULL, pooling = NULL, classes = 1000) {
440440

441441
keras$applications$MobileNetV2(
442442
input_shape = as_integer_tuple(input_shape),
443443
alpha = alpha,
444-
depth_multiplier = as.integer(depth_multiplier),
445444
include_top = include_top,
446445
weights = weights,
447446
input_tensor = input_tensor,

0 commit comments

Comments
 (0)