@@ -145,7 +145,7 @@ sequential_model_input_layer <- function(input_shape = NULL,
145145
146146
147147
148- # ' Replicates a model on different GPUs.
148+ # ' (Deprecated) Replicates a model on different GPUs.
149149# '
150150# ' @param model A Keras model instance. To avoid OOM errors,
151151# ' this model could have been built on CPU, for instance
@@ -247,6 +247,7 @@ sequential_model_input_layer <- function(input_shape = NULL,
247247# ' classes = num_classes
248248# ' })
249249# ' ```
250+ # ' @keywords internal
250251# ' @export
251252multi_gpu_model <- function (model , gpus = NULL , cpu_merge = TRUE , cpu_relocation = FALSE ) {
252253
@@ -933,6 +934,7 @@ predict.keras.engine.training.Model <- function(object, x, batch_size=NULL, verb
933934# '
934935# ' @family model functions
935936# '
937+ # ' @keywords internal
936938# ' @export
937939predict_proba <- function (object , x , batch_size = NULL , verbose = 0 , steps = NULL ) {
938940 warning(" `predict_proba()` is deprecated and was removed from tensorflow in version 2.6, " ,
@@ -957,6 +959,7 @@ predict_proba <- function(object, x, batch_size = NULL, verbose = 0, steps = NUL
957959}
958960
959961# ' @rdname predict_proba
962+ # ' @keywords internal
960963# ' @export
961964predict_classes <- function (object , x , batch_size = NULL , verbose = 0 , steps = NULL ) {
962965 warning(
@@ -1048,7 +1051,7 @@ test_on_batch <- function(object, x, y, sample_weight = NULL) {
10481051
10491052
10501053
1051- # ' Fits the model on data yielded batch-by-batch by a generator.
1054+ # ' (Deprecated) Fits the model on data yielded batch-by-batch by a generator.
10521055# '
10531056# ' The generator is run in parallel to the model, for efficiency. For instance,
10541057# ' this allows you to do real-time data augmentation on images on CPU in
@@ -1111,6 +1114,7 @@ test_on_batch <- function(object, x, y, sample_weight = NULL) {
11111114# '
11121115# ' @family model functions
11131116# '
1117+ # ' @keywords internal
11141118# ' @export
11151119fit_generator <- function (object , generator , steps_per_epoch , epochs = 1 ,
11161120 verbose = getOption(" keras.fit_verbose" , default = 1 ), callbacks = NULL ,
@@ -1155,7 +1159,7 @@ fit_generator <- function(object, generator, steps_per_epoch, epochs = 1,
11551159 do.call(fit , args )
11561160}
11571161
1158- # ' Evaluates the model on a data generator.
1162+ # ' (Deprecated) Evaluates the model on a data generator.
11591163# '
11601164# ' The generator should return the same kind of data as accepted by
11611165# ' `test_on_batch()`.
@@ -1173,6 +1177,7 @@ fit_generator <- function(object, generator, steps_per_epoch, epochs = 1,
11731177# '
11741178# ' @family model functions
11751179# '
1180+ # ' @keywords internal
11761181# ' @export
11771182evaluate_generator <- function (object , generator , steps , max_queue_size = 10 , workers = 1 ,
11781183 callbacks = NULL ) {
@@ -1197,7 +1202,7 @@ evaluate_generator <- function(object, generator, steps, max_queue_size = 10, wo
11971202}
11981203
11991204
1200- # ' Generates predictions for the input samples from a data generator.
1205+ # ' (Deprecated) Generates predictions for the input samples from a data generator.
12011206# '
12021207# ' The generator should return the same kind of data as accepted by
12031208# ' `predict_on_batch()`.
@@ -1218,6 +1223,7 @@ evaluate_generator <- function(object, generator, steps, max_queue_size = 10, wo
12181223# '
12191224# ' @family model functions
12201225# '
1226+ # ' @keywords internal
12211227# ' @export
12221228predict_generator <- function (object , generator , steps , max_queue_size = 10 , workers = 1 , verbose = 0 ,
12231229 callbacks = NULL ) {
0 commit comments