Using nll functions

knitr::opts_chunk$set(
  collapse = TRUE,
  comment = "#>"
)
library(anovir)

Introduciton {#top}

This vignette explains how to use the default form of the negative log-likelihood (nll) functions in this package.

In their default form, the various parameters underlying each nll_function are estimated as constants. However, this behaviour can be extended to make these parameters into functions themselves. In such cases, it is the parameters of these parameter functions that are estimated by constants.

How to modify nll_functions is described in a separate vignette: nll_functions_modifying

Two-step preparation

The nll_functions in this package calcuate the negative log-likelihood (nll) for observed patterns of mortality in survival data based on the approach analysing relative survival. The different functions vary in how they assume the data are structured. However the way to use each function is the same and involves a two-step process;

The resulting estimates of these variables can be used to describe the patterns of background mortality and mortality due to infection in the observed data, including the pathogen's virulence.

The following sections provide further details of the two-step process.

Step #1 {#step1}

The first step is to write a preparatory-, or prep-, function which collects the information needed to define and parameterise the likelihood expression to be minimised.

The example below shows Step #1 preparing the function nll_basic for analysis, given the data frame data01.

data01 is a subset of data from the study by Blanford et al [@Blanford_2012]. The data are from the uninfected and infected treatments cont and Bb06, respectively, of the 3rd experimental block of the experiment.

data01 <- subset(data_blanford,
  (data_blanford$block == 3) & 
  ((data_blanford$treatment == 'cont') | (data_blanford$treatment == 'Bb06')) &
  (data_blanford$day > 0)
  )
head(data01, 6)
    m01_prep_function <- function(a1, b1, a2, b2){
      nll_basic(
        a1, b1, a2, b2,
        data = data01,
        time = day,
        censor = censor,
        infected_treatment = inf,
        d1 = 'Weibull', d2 = 'Weibull')
        }

Here,

The information above is used to define a log-likelihood function of the form;

\begin{equation} \log L = \sum_{i=1}^{n} \left{ d \log \left[ h_1(t_i) + g \cdot h_2(t_i) \right] + \log \left[ S_1(t_i) \right] + g \cdot \log \left[ S_2(t_i) \right] \right} \end{equation}

where;

The Weibull distribution was chosen to describe the background rate of mortality and mortality due to infection.

The survival function describing background mortality was,

\begin{equation} S_1(t) = \exp \left[ - \exp \left( z_1 \right) \right] \end{equation}

with the hazard function being,

\begin{equation} h_1(t) = \frac{1}{b_1 t} \exp \left( z_1 \right) \end{equation}

where, (z_1 = \left( \log t - a_1\right) / b_1 )

Equivalent expressions described mortality due to infection, where the index '1' is replaced by '2'.

a~1~, b~1~, a~2~, b~2~ are the variables to be estimated, as listed in the formal arguments of m01_prep_function.

back to top

Step #2 {#step2}

Step #2 involves calling the mle2 function of the package bbmle [@bbmle] which will estimate the values of variables maximising the likelihood function.

In the example below, mle2 is given the name of the prep-function, m01_prep_function along with a list giving starting values for the variables to be estimated.

    m01 <- mle2(m01_prep_function,
             start = list(a1 = 2, b1 = 0.5, a2 = 2, b2 = 0.5)
             )

Yielding the results,

    m01_prep_function <- function(a1, b1, a2, b2){
      nll_basic(
        a1, b1, a2, b2,
        data = data01,
        time = day,
        censor = censor,
        infected_treatment = inf,
        d1 = 'Weibull',
        d2 = 'Weibull')
        }

    m01 <- mle2(m01_prep_function,
             start = list(a1 = 2, b1 = 0.5, a2 = 2, b2 = 0.5)
             )

    summary(m01)

The location and scale parameters describing mortality due to infection, a2, b2, lead to a numerical expression for pathogen's virulence at time t as,

\begin{equation} \frac{1}{0.183\: t} \exp \left( \frac{\log t - 2.581}{0.183} \right) \ \end{equation}

where the rate of mortality due to infection accelerates over time.

The default of nll_basic returns estimates for, a1, b1, a2, b2. The function conf_ints_virulence can be used to generate a matrix with the estimate of virulence (± 95\% c.i.) based on the variance and covariance of estimates for a2 and b2.

    coef(m01)

    vcov(m01)

    a2 <- coef(m01)[[3]]
    b2 <- coef(m01)[[4]]
    var_a2 <- vcov(m01)[3,3]
    var_b2 <- vcov(m01)[4,4]
    cov_a2b2 <- vcov(m01)[3,4]

    ci_matrix01 <- conf_ints_virulence(
      a2 = a2, b2 = b2,
      var_a2 = var_a2, var_b2 = var_b2, cov_a2b2 = cov_a2b2, 
      d2 = "Weibull", tmax = 14)

    tail(ci_matrix01)

    plot(ci_matrix01[, 't'], ci_matrix01[, 'h2'], 
         type = 'l', col = 'red', xlab = 'time', ylab = 'virulence (± 95% ci)'
         )
      lines(ci_matrix01[, 'lower_ci'], col = 'grey')
      lines(ci_matrix01[, 'upper_ci'], col = 'grey')

back to top

References



Try the anovir package in your browser

Any scripts or data that you put into this service are public.

anovir documentation built on Oct. 24, 2020, 9:08 a.m.