R/prob_trans_stsl.R

Defines functions prob_trans_stsl

Documented in prob_trans_stsl

##' Probability of transmission assuming single-transmission and single-linkage
##'
##' @description
##' `r lifecycle::badge('deprecated')`
##' This function calculates the probability that two cases are linked by direct transmission
##' given that they have been linked by phylogenetic criteria. The single-transmission and single-linkage method assumes the following:
##' \enumerate{
##'      \item Each case \eqn{i} is linked by transmission to only one other case \eqn{j} in the population (\eqn{N}).
##'      \item Each case \eqn{i} is linked by the linkage criteria to only one other case \eqn{j} in the sampled population (\eqn{M}).
##'      }
##'
##' For perfect sensitivity, set `eta = 1`.
##'
##' @param eta scalar or vector giving the sensitivity of the linkage criteria
##' @param chi scalar or vector giving the specificity of the linkage criteria
##' @param rho scalar or vector giving the proportion of the final outbreak size that is sampled
##' @param M scalar or vector giving the number of cases sampled
##'
##' @return scalar or vector giving the probability of transmission between two cases given linkage by phylogenetic criteria
##'
##' @author John Giles, Shirlee Wohl, and Justin Lessler
##'
##' @examples
##' # perfect sensitivity and specificity
##' prob_trans_stsl(eta=1, chi=1, rho=0.2, M=100)
##'
##' # perfect sensitivity only
##' prob_trans_stsl(eta=1, chi=0.95, rho=0.2, M=100)
##'
##' prob_trans_stsl(eta=0.99, chi=0.95, rho=0.9, M=50)
##'
##' prob_trans_stsl(eta=0.99, chi=0.95, rho=0.05, M=100)
##'
##' @family prob_trans
##'
##' @export

prob_trans_stsl <- function(eta, chi, rho, M) {
    lifecycle::deprecate_soft("1.0.0", "prob_trans_stsl()", "translink_prob_transmit_stsl()")
    lifecycle::deprecate_soft("1.0.0", "prob_trans_stsl(eta)", "translink_prob_transmit_stsl(sensitivity)")
    lifecycle::deprecate_soft("1.0.0", "prob_trans_stsl(chi)", "translink_prob_transmit_stsl(specificity)")

    if (!all(is.numeric(eta), eta >= 0 & eta <= 1))
        stop("eta must be numeric between 0 and 1")
    if (!all(is.numeric(chi), chi >= 0 & chi <= 1))
        stop("chi must be numeric between 0 and 1")
    if (!all(is.numeric(rho), rho > 0 & rho <= 1))
        stop("rho must be numeric > 0 and <= 1")
    if (!all(is.numeric(M) | is.integer(M), M >= 0))
        stop("Sample size (M) must be integer or numeric greater than 0")

    (eta * rho)/((eta * rho) + ((1 - chi^(M - 2)) * (1 - eta) * rho) + ((1 - chi^(M -
        1)) * (1 - rho)))
}
HopkinsIDD/phylosamp documentation built on May 28, 2023, 3:21 a.m.