Skip to content

Commit ff455f5

Browse files
Turgut AbdullayevTurgut Abdullayev
authored andcommitted
fix
1 parent 1f81a5c commit ff455f5

File tree

1 file changed

+1
-1
lines changed

1 file changed

+1
-1
lines changed

vignettes/examples/eager_cvae.R

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -214,7 +214,7 @@ show_grid <- function(epoch) {
214214
z_sample <- matrix(c(grid_x[i], grid_y[j]), ncol = 2)
215215
column <-
216216
rbind(column,
217-
(decoder(z_sample) %>% tf$nn$sigmoid() %>% as.numeric()) %>% matrix(ncol = img_size))
217+
(decoder(k_cast(z_sample,'float32')) %>% tf$nn$sigmoid() %>% as.numeric()) %>% matrix(ncol = img_size))
218218
}
219219
rows <- cbind(rows, column)
220220
}

0 commit comments

Comments
 (0)