We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent 1f81a5c commit ff455f5Copy full SHA for ff455f5
vignettes/examples/eager_cvae.R
@@ -214,7 +214,7 @@ show_grid <- function(epoch) {
214
z_sample <- matrix(c(grid_x[i], grid_y[j]), ncol = 2)
215
column <-
216
rbind(column,
217
- (decoder(z_sample) %>% tf$nn$sigmoid() %>% as.numeric()) %>% matrix(ncol = img_size))
+ (decoder(k_cast(z_sample,'float32')) %>% tf$nn$sigmoid() %>% as.numeric()) %>% matrix(ncol = img_size))
218
}
219
rows <- cbind(rows, column)
220
0 commit comments