Skip to content

Commit

Permalink
update jmlr.org urls -> proceedings.mlr.press
Browse files Browse the repository at this point in the history
  • Loading branch information
t-kalinowski committed May 23, 2022
1 parent a3ade6f commit eee28b4
Show file tree
Hide file tree
Showing 12 changed files with 15 additions and 15 deletions.
4 changes: 2 additions & 2 deletions R/initializers.R
Original file line number Diff line number Diff line change
Expand Up @@ -206,7 +206,7 @@ initializer_lecun_normal <- function(seed = NULL) {
#' @inheritParams initializer_random_normal
#'
#' @section References:
#' Glorot & Bengio, AISTATS 2010 <https://jmlr.org/proceedings/papers/v9/glorot10a/glorot10a.pdf>
#' Glorot & Bengio, AISTATS 2010 <https://proceedings.mlr.press/v9/glorot10a/glorot10a.pdf>
#'
#' @family initializers
#'
Expand All @@ -228,7 +228,7 @@ initializer_glorot_normal <- function(seed = NULL) {
#' @inheritParams initializer_random_normal
#'
#' @section References:
#' Glorot & Bengio, AISTATS 2010 https://jmlr.org/proceedings/papers/v9/glorot10a/glorot10a.pdf
#' Glorot & Bengio, AISTATS 2010 <https://proceedings.mlr.press/v9/glorot10a/glorot10a.pdf>
#'
#' @family initializers
#'
Expand Down
6 changes: 3 additions & 3 deletions R/layers-convolutional.R
Original file line number Diff line number Diff line change
Expand Up @@ -1308,7 +1308,7 @@ layer_cropping_3d <- function(object, cropping = list(c(1L, 1L), c(1L, 1L), c(1L
#' @param unit_forget_bias Boolean. If TRUE, add 1 to the bias of the forget
#' gate at initialization. Use in combination with `bias_initializer="zeros"`.
#' This is recommended in [Jozefowicz et
#' al.](https://www.jmlr.org/proceedings/papers/v37/jozefowicz15.pdf)
#' al.](https://proceedings.mlr.press/v37/jozefowicz15.pdf)
#' @param kernel_regularizer Regularizer function applied to the `kernel`
#' weights matrix.
#' @param recurrent_regularizer Regularizer function applied to the
Expand Down Expand Up @@ -1450,7 +1450,7 @@ layer_conv_lstm_2d <- function(object, filters, kernel_size, strides = c(1L, 1L)
#' @param unit_forget_bias Boolean. If TRUE, add 1 to the bias of the forget gate at
#' initialization. Use in combination with `bias_initializer="zeros"`. This
#' is recommended in [Jozefowicz et al., 2015](
#' https://www.jmlr.org/proceedings/papers/v37/jozefowicz15.pdf)
#' https://proceedings.mlr.press/v37/jozefowicz15.pdf)
#'
#' @param kernel_regularizer Regularizer function applied to the `kernel` weights
#' matrix.
Expand Down Expand Up @@ -1595,7 +1595,7 @@ function(object,
#' @param unit_forget_bias Boolean. If TRUE, add 1 to the bias of the forget gate at
#' initialization. Use in combination with `bias_initializer="zeros"`. This
#' is recommended in [Jozefowicz et al., 2015](
#' https://www.jmlr.org/proceedings/papers/v37/jozefowicz15.pdf)
#' https://proceedings.mlr.press/v37/jozefowicz15.pdf)
#'
#' @param kernel_regularizer Regularizer function applied to the `kernel` weights
#' matrix.
Expand Down
2 changes: 1 addition & 1 deletion R/layers-recurrent-cells.R
Original file line number Diff line number Diff line change
Expand Up @@ -378,7 +378,7 @@ function(cells, ...)
#' @param unit_forget_bias Boolean (default `TRUE`). If TRUE, add 1 to the bias of
#' the forget gate at initialization. Setting it to true will also force
#' `bias_initializer="zeros"`. This is recommended in [Jozefowicz et
#' al.](https://www.jmlr.org/proceedings/papers/v37/jozefowicz15.pdf)
#' al.](https://proceedings.mlr.press/v37/jozefowicz15.pdf)
#'
#' @param kernel_regularizer Regularizer function applied to the `kernel` weights
#' matrix. Default: `NULL`.
Expand Down
2 changes: 1 addition & 1 deletion R/layers-recurrent.R
Original file line number Diff line number Diff line change
Expand Up @@ -234,7 +234,7 @@ layer_cudnn_gru <- function(object, units,
#' @param unit_forget_bias Boolean. If TRUE, add 1 to the bias of the forget
#' gate at initialization. Setting it to true will also force
#' `bias_initializer="zeros"`. This is recommended in [Jozefowicz et
#' al.](https://www.jmlr.org/proceedings/papers/v37/jozefowicz15.pdf)
#' al.](https://proceedings.mlr.press/v37/jozefowicz15.pdf)
#'
#' @template roxlate-recurrent-layer
#'
Expand Down
2 changes: 1 addition & 1 deletion man/initializer_glorot_normal.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/initializer_glorot_uniform.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer_conv_lstm_1d.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer_conv_lstm_2d.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer_conv_lstm_3d.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer_cudnn_lstm.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer_lstm.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

2 changes: 1 addition & 1 deletion man/layer_lstm_cell.Rd

Some generated files are not rendered by default. Learn more about how customized files appear on GitHub.

0 comments on commit eee28b4

Please sign in to comment.