R/2.11.main.R

Defines functions summary.mmcsd.theta

Documented in summary.mmcsd.theta

#' Summarise the results of 'cov_mmcsd' fit.
#'
#' @param object A mmcsd.theta fitted model
#' @param ... Additional params passed to summary
#'
#' @return Return NULL and print in terminal the results.
#'
#' @export
#' 
#' @examples
#' \donttest{
#' fit <- mmcsd(
#'  score ~ wave + ageg + ecacg + qualifg,
#'  waves = wave, ids = id,
#'  weights = weight, stratum = strata, cluster = cluster,
#'  data = example_data, sigma = "exchangeable"
#' )
#' fitTheta_ucm <- cov_mmcsd(fit,
#'  fittingType = "PML", sigmaThetaExpr = "UCM",
#'  optimParams = list(par = c(7, 5))
#' )
#' summary(fitTheta_ucm)
#' 
#' }

summary.mmcsd.theta <- function(object, ...) {
  thetaTable <- getThetaTable(object)
  optimTable <- getOptimTable(object)

  catCall(object)
  catFitTypes(object)
  catFitResults(object, thetaTable)
  catOptimDetails(object, optimTable)
  catSigmaThetaMatrix(object)
  catGoodnessOfFitMeasures(object)

  return(invisible(NULL))
}

Try the Mmcsd package in your browser

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

Mmcsd documentation built on March 31, 2023, 7:23 p.m.