R/vadoseerror2.R

#' Internal function to Catch  errors and warnings
#'
#' @param expr an  R expression to evaluate
#'
#' @return value a list with 'value' and 'warning', where value may be an error caught
#' @export
#'
#' @examples
#' thiserror=str( vadose.tryCatch( log( "a" ) ) )$value
vadose.tryCatch = function(expr){
  
  W <- NULL
  w.handler <- function(w){ # warning handler
    W <<- w
    invokeRestart("muffleWarning")
  }
  list(value = withCallingHandlers(tryCatch(expr, error = function(e) e),
                                   warning = w.handler),
       warning = W)
}
gowusu/vadose documentation built on May 17, 2019, 7:59 a.m.