R/jmcmControl.R

Defines functions jmcmControl namedList

Documented in jmcmControl

namedList <- function(...) {
  L <- list(...)
  snm <- sapply(substitute(list(...)), deparse)[-1]
  if (is.null(nm <- names(L))) nm <- snm
  if (any(nonames <- nm == "")) nm[nonames] <- snm[nonames]
  setNames(L,nm)
}

#' @title Control of Joint Mean Covariance Model Fitting
#'
#' @description Construct control structures for joint mean covariance model
#' fitting
#'
#' @param trace whether or not the value of the objective function and the
#' parameters should be print on every trace'th iteration.
#' @param profile whether or not parameters should be estimated sequentially
#' using the idea of profile likelihood.
#' @param ignore.const.term whether or not the constant term should be considered 
#' when calculating log-likelihood and BIC.
#' function
#' @param original.poly.order whether or not the original poly order p q d should 
#' be used
#' @param errormsg whether or not the error message should be print
#'
#' @export jmcmControl
jmcmControl <- function(trace = FALSE, profile = TRUE, 
                        ignore.const.term = TRUE, original.poly.order = FALSE, errormsg = FALSE)
{
    structure(namedList(trace, profile, ignore.const.term, original.poly.order, errormsg),
              class = "jmcmControl")
}

Try the jmcm package in your browser

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

jmcm documentation built on Jan. 16, 2021, 5:32 p.m.