R/parse_contrast.R

Defines functions parse_contrast_q parse_contrast

# This function was copied from proDA
parse_contrast <- function(contrast, levels) {
  cnt_capture <- substitute(contrast)
  parse_contrast_q(cnt_capture, levels, env = parent.frame())
}


parse_contrast_q <- function(contrast, levels, env = parent.frame()) {
  if(missing(contrast)){
    stop("No contrast argument was provided! The option is any linear combination of:\n",
         paste0(levels, collapse = ", "))
  }

  stopifnot(! is.null(levels))
  if(is.factor(levels)){
    levels <- levels(levels)
  }else if(! is.character(levels)){
    stop("levels must be either a character vector or a factor")
  }

  indicators <- diag(nrow=length(levels))
  rownames(indicators) <- levels
  colnames(indicators) <- levels

  level_environment <- new.env(parent = env)

  for(lvl in levels){
    ind <- indicators[, lvl]
    names(ind) <- levels
    assign(lvl, ind, level_environment)
  }
  tryCatch({
    res <- eval(contrast, envir= level_environment)
    if(! is.numeric(res)){
      if(is.character(res)){
        # If contrast was a string, eval will just spit it out the same way
        res <- eval(parse(text = res), envir= level_environment)
      }
    }
  }, error = function(e){
    # Try to extract text from error message
    match <- regmatches(e$message, regexec("object '(.+)' not found", e$message))[[1]]
    if(length(match) == 2){
      stop("Object '", match[2], "' not found. Allowed variables in contrast are:\n",
           paste0(levels, collapse = ", "))
    }else{
      stop(e$message)
    }
  })
  res
}

Try the glmGamPoi package in your browser

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

glmGamPoi documentation built on Nov. 8, 2020, 7:14 p.m.