Skip to content

Commit d78f5de

Browse files
committed
Tidy
1 parent a8d9a13 commit d78f5de

File tree

4 files changed

+0
-11
lines changed

4 files changed

+0
-11
lines changed

R/utils.R

Lines changed: 0 additions & 6 deletions
Original file line numberDiff line numberDiff line change
@@ -530,12 +530,6 @@ keras_array <- function(x, dtype = NULL) {
530530
if (is.null(x))
531531
return(x)
532532

533-
# reflect HDF5
534-
# TODO: is this still relevent? Is it still the correct S3 class?
535-
# keras 3 (and tf.keras 2) seems to not export a HDF5 wrapper ...
536-
if (inherits(x, "keras.utils.io_utils.HDF5Matrix"))
537-
return(x)
538-
539533
# reflect tensors
540534
if (keras$ops$is_tensor(x))
541535
return(x)

tests/testthat/test-Layer.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -263,7 +263,6 @@ test_succeeds("custom layers can accept standard layer args like input_shape", {
263263

264264
})
265265

266-
# TODO: document change: inputs to the keras api being tensors/arrays now strictly enforced
267266

268267
test_that("calling Layer() doesn't initialize Python", {
269268
expect_no_error(callr::r(function() {

tests/testthat/test-generators.R

Lines changed: 0 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -144,9 +144,6 @@ test_succeeds("R function can be used as custom generator with multiple inputs",
144144
list(tuple(keras_array(1), keras_array(2)),
145145
keras_array(3))
146146
}
147-
# TODO: this might need a PR up stream, or some chages to as_generator.function()
148-
# right now it's very picky about tuple vs lists in generator yielded values.
149-
# and tree.map_structure() / tf.next.flatten() are picky too.
150147

151148
model %>% compile(loss = "mse", optimizer = "sgd")
152149
model %>% fit(generator, steps_per_epoch = 10,

tests/testthat/test-layers.R

Lines changed: 0 additions & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -3,7 +3,6 @@ context("layers")
33
test_call_succeeds("layer_input", {
44
layer_input(shape = c(32))
55
input <- layer_input(shape = c(32), sparse = TRUE)
6-
# TODO: arg rename: ragged -> sparse
76
})
87

98
test_call_succeeds("layer_dense", {

0 commit comments

Comments
 (0)