vwc.tracebacks {AnalysisPageServer}R Documentation

vwc.tracebacks

Description

Return traceback(s) for an AnalysisPageValueWithConditions

Usage

vwc.tracebacks(vwc, type = "messages")

Arguments

vwc

AnalysisPageValueWithConditions

type

Type of conditions. Must be "messages", "warnings" or "error". Default: "messages". A (new) error is thrown if type is "error" but the vwc is not an error (that is, does not have an error, or more specifically, !vwc.is.error(vwc)).

Details

Return traceback(s) for an AnalysisPageValueWithConditions

Value

For "messages" or "warnings" it gives a list of Charvecs of tracebacks, as built by getTraceback. For "error" it only gives a single charvec, since there is only one error.

Author(s)

Brad Friedman

Examples

f <- function(msg)  {
  warning(msg)
}
vwc <- tryKeepConditions({
  f("foo")
  f("bar")
})
vwc.tracebacks(vwc, "warnings")

[Package AnalysisPageServer version 1.20.0 Index]