Skip to content

Commit

Permalink
Drop invalid crosslinks
Browse files Browse the repository at this point in the history
  • Loading branch information
richfitz committed Dec 12, 2024
1 parent f20459a commit 0be8a76
Show file tree
Hide file tree
Showing 5 changed files with 30 additions and 30 deletions.
2 changes: 1 addition & 1 deletion R/dsl.R
Original file line number Diff line number Diff line change
Expand Up @@ -117,7 +117,7 @@ monty_dsl_parse <- function(x, type = NULL, gradient = NULL, fixed = NULL) {
##' provided!
##'
##' * `sample`: A function to sample from the distribution, given (as
##' a first argument) a rng object (see [monty_rng])
##' a first argument) a `monty_rng` object (see [monty_rng_create])
##'
##' @export
##' @examples
Expand Down
28 changes: 14 additions & 14 deletions R/model.R
Original file line number Diff line number Diff line change
Expand Up @@ -118,13 +118,13 @@ monty_model_properties <- function(has_gradient = NULL,
##' `(-Inf, Inf)`.
##'
##' * `direct_sample`: A function to sample directly from the
##' parameter space, given a [monty_rng] object to sample from.
##' In the case where a model returns a posterior (e.g., in Bayesian
##' inference), this is assumed to be sampling from the prior.
##' We'll use this for generating initial conditions for MCMC where
##' those are not given, and possibly other uses. If not given then
##' when using [monty_sample()] the user will have to provide a
##' vector of initial states.
##' parameter space, given a `monty_rng` object to sample from (see
##' [monty_rng_create]). In the case where a model returns a
##' posterior (e.g., in Bayesian inference), this is assumed to be
##' sampling from the prior. We'll use this for generating initial
##' conditions for MCMC where those are not given, and possibly
##' other uses. If not given then when using [monty_sample()] the
##' user will have to provide a vector of initial states.
##'
##' * `gradient`: A function to compute the gradient of `density` with
##' respect to the parameter vector; takes a parameter vector and
Expand All @@ -141,11 +141,11 @@ monty_model_properties <- function(has_gradient = NULL,
##' look after their own stream, and that they may need many
##' streams). Models that provide this method are assumed to be
##' stochastic; however, you can use the `is_stochastic` property
##' (via [monty_model_properties()]) to override this (e.g., to
##' run a stochastic model with its deterministic expectation).
##' This function takes a raw vector of random number state from
##' [monty_rng] and uses it to set the random number state for
##' your model; this is derived from the random number stream for a
##' (via [monty_model_properties()]) to override this (e.g., to run
##' a stochastic model with its deterministic expectation). This
##' function takes a raw vector of random number state from a
##' `monty_rng` and uses it to set the random number state for your
##' model; this is derived from the random number stream for a
##' particular chain, jumped ahead.
##'
##' * `get_rng_state`: A function to get the RNG state; must be
Expand Down Expand Up @@ -304,8 +304,8 @@ monty_model_gradient <- function(model, parameters, named = FALSE) {
##'
##' @inheritParams monty_model_gradient
##'
##' @param rng Random number state, created by [monty_rng]. Use of
##' an RNG with more than one stream may or may not work as
##' @param rng Random number state, created by [monty_rng_create].
##' Use of an RNG with more than one stream may or may not work as
##' expected; this is something we need to tidy up (`mrc-5292`)
##'
##' @return A vector or matrix of sampled parameters
Expand Down
2 changes: 1 addition & 1 deletion man/monty_dsl_parse_distribution.Rd

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

24 changes: 12 additions & 12 deletions man/monty_model.Rd

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

4 changes: 2 additions & 2 deletions man/monty_model_direct_sample.Rd

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

0 comments on commit 0be8a76

Please sign in to comment.