如何将警告和错误保存为函数的输出?

Posted

技术标签:

【中文标题】如何将警告和错误保存为函数的输出?【英文标题】:How do I save warnings and errors as output from a function? 【发布时间】:2011-06-24 07:37:29 【问题描述】:

我正在使用 lapply 对大量项目运行一个复杂的函数,我想将每个项目的输出(如果有)连同产生的任何警告/错误一起保存,以便我可以判断哪个项目产生了哪个警告/错误。

我找到了一种使用withCallingHandlers (described here) 来捕获警告的方法。但是,我也需要捕获错误。我可以通过将其包装在 tryCatch 中来做到这一点(如下面的代码所示),但是有更好的方法吗?

catchToList <- function(expr) 
  val <- NULL
  myWarnings <- NULL
  wHandler <- function(w) 
    myWarnings <<- c(myWarnings, w$message)
    invokeRestart("muffleWarning")
  
  myError <- NULL
  eHandler <- function(e) 
    myError <<- e$message
    NULL
  
  val <- tryCatch(withCallingHandlers(expr, warning = wHandler), error = eHandler)
  list(value = val, warnings = myWarnings, error=myError)
 

此函数的示例输出为:

> catchToList(warning("warning 1");warning("warning 2");1)
$value
[1] 1

$warnings
[1] "warning 1" "warning 2"

$error
NULL

> catchToList(warning("my warning");stop("my error"))
$value
NULL

$warnings
[1] "my warning"

$error
[1] "my error"

这里有几个关于 SO 的问题讨论 tryCatch 和错误处理,但我发现没有一个问题可以解决这个特定问题。请参阅 How can I check whether a function call results in a warning?、warnings() does not work within a function? How can one work around this? 和 How to tell lapply to ignore an error and process the next thing in the list? 了解最相关的内容。

【问题讨论】:

【参考方案1】:

也许这与您的解决方案相同,但我写了一个 factory 将普通旧函数转换为捕获其值、错误和警告的函数,所以我可以

test <- function(i)
    switch(i, "1"=stop("oops"), "2"= warning("hmm"); i , i)
res <- lapply(1:3, factory(test))

结果的每个元素都包含值、错误和/或警告。这适用于用户函数、系统函数或匿名函数 (factory(function(i) ...))。这里是工厂

factory <- function(fun)
    function(...) 
        warn <- err <- NULL
        res <- withCallingHandlers(
            tryCatch(fun(...), error=function(e) 
                err <<- conditionMessage(e)
                NULL
            ), warning=function(w) 
                warn <<- append(warn, conditionMessage(w))
                invokeRestart("muffleWarning")
            )
        list(res, warn=warn, err=err)
    

还有一些处理结果列表的助手

.has <- function(x, what)
    !sapply(lapply(x, "[[", what), is.null)
hasWarning <- function(x) .has(x, "warn")
hasError <- function(x) .has(x, "err")
isClean <- function(x) !(hasError(x) | hasWarning(x))
value <- function(x) sapply(x, "[[", 1)
cleanv <- function(x) sapply(x[isClean(x)], "[[", 1)

【讨论】:

是的,同样的想法,但更好!您是否考虑过将其包装成一个包裹?从我在这里看到的其他问题中,其他人也会发现这也很有用。 我有一个函数将其调用存储在输出中。调用 factory 后,此调用已更改,例如fun(formula = ..1, data = ..2, method = "genetic", ratio = ..4, print.level = 0),其中formula 应该是我的原始输入公式,但会被覆盖。有什么建议吗? @RomanLuštrik:我猜这是因为它实际上是在创建一个新函数 fun 并使用 ... 调用它,而不是直接调用你的函数。我想知道我的catchToList 函数是否有效,或者是否可以修改factory,也许可以使用do.call。怎么复制? 我真的很喜欢下面@russellpierce 使用属性捕获警告和错误消息的方法。所以上面的中间NULL可以替换为NA"An error occurred"或类似的,最后第二行替换为attr(res,"warning") &lt;- warn; attr(res,"error") &lt;- err; return(res) 当我尝试在上面使用例如f.log &lt;- factory(log) 然后我执行isClean(f.log("a")) 或任何其他辅助函数时,我得到:“FUN 中的错误(X[[i]],... ) : 下标越界"。如果我这样做isClean(f.log(10)),也会出现同样的错误【参考方案2】:

试试evaluate package。

library(evaluate)
test <- function(i)
    switch(i, "1"=stop("oops"), "2"= warning("hmm"); i , i)

t1 <- evaluate("test(1)")
t2 <- evaluate("test(2)")
t3 <- evaluate("test(3)")

虽然它目前缺乏一种评估表达式的好方法 - 这主要是因为它的目标是准确再现 R 输出在控制台上给定的文本输入。

replay(t1)
replay(t2)
replay(t3)

它还捕获消息,输出到控制台,并确保一切都按照发生的顺序正确交错。

【讨论】:

有没有办法在这个例子中或者一般情况下捕获 replay(t2) 的输出? x &lt;- capture.output(replay(t1)) 不会产生完整的错误消息。谢谢。【参考方案3】:

我已经合并了 Martins soulution (https://***.com/a/4952908/2161065) 和 R-help 邮件列表中的一个,你可以通过 demo(error.catching) 获得。

主要思想是保留警告/错误消息以及触发此问题的命令。

myTryCatch <- function(expr) 
  warn <- err <- NULL
  value <- withCallingHandlers(
    tryCatch(expr, error=function(e) 
      err <<- e
      NULL
    ), warning=function(w) 
      warn <<- w
      invokeRestart("muffleWarning")
    )
  list(value=value, warning=warn, error=err)

例子:

myTryCatch(log(1))
myTryCatch(log(-1))
myTryCatch(log("a"))

输出:

> myTryCatch(log(1))

$值 [1] 0 $警告 NULL $error NULL

> myTryCatch(log(-1))

$value [1] NaN $警告 $error NULL

> myTryCatch(log("a"))

$值 NULL $警告 NULL $错误

【讨论】:

它很好,但不会捕获消息或打印。我会很高兴只有一个函数可以捕获所有 4 种主要输出类型。我说主要,因为还有一些其他的,例如绘图、写入剪贴板和写入文件。在某些情况下,人们也会注意捕捉这些。【参考方案4】:

我的回答(以及对 Martin 出色代码的修改)的目的是,如果一切顺利,工厂化函数会返回预期的数据结构。如果遇到警告,则会将其附加到 factory-warning 属性下的结果中。 data.table 的setattr 函数用于允许与该包的兼容性。如果遇到错误,结果是字符元素“工厂函数发生错误”,factory-error 属性将携带错误消息。

#' Catch errors and warnings and store them for subsequent evaluation
#'
#' Factory modified from a version written by Martin Morgan on Stack Overflow (see below).  
#' Factory generates a function which is appropriately wrapped by error handlers.  
#' If there are no errors and no warnings, the result is provided.  
#' If there are warnings but no errors, the result is provided with a warn attribute set.
#' If there are errors, the result retutrns is a list with the elements of warn and err.
#' This is a nice way to recover from a problems that may have occurred during loop evaluation or during cluster usage.
#' Check the references for additional related functions.
#' I have not included the other factory functions included in the original Stack Overflow answer because they did not play well with the return item as an S4 object.
#' @export
#' @param fun The function to be turned into a factory
#' @return The result of the function given to turn into a factory.  If this function was in error "An error as occurred" as a character element.  factory-error and factory-warning attributes may also be set as appropriate.
#' @references
#' \urlhttp://***.com/questions/4948361/how-do-i-save-warnings-and-errors-as-output-from-a-function
#' @author Martin Morgan; Modified by Russell S. Pierce
#' @examples 
#' f.log <- factory(log)
#' f.log("a")
#' f.as.numeric <- factory(as.numeric)
#' f.as.numeric(c("a","b",1))
factory <- function (fun) 
  errorOccurred <- FALSE
  library(data.table)
  function(...) 
    warn <- err <- NULL
    res <- withCallingHandlers(tryCatch(fun(...), error = function(e) 
      err <<- conditionMessage(e)
      errorOccurred <<- TRUE
      NULL
    ), warning = function(w) 
      warn <<- append(warn, conditionMessage(w))
      invokeRestart("muffleWarning")
    )
    if (errorOccurred) 
      res <- "An error occurred in the factory function"
     

    if (is.character(warn)) 
      data.table::setattr(res,"factory-warning",warn)
     else 
      data.table::setattr(res,"factory-warning",NULL) 
    

    if (is.character(err)) 
      data.table::setattr(res,"factory-error",err)
     else 
      data.table::setattr(res, "factory-error", NULL)
      
    return(res)
  

因为我们没有将结果包装在一个额外的列表中,所以我们不能做出允许他的某些访问器函数的那种假设,但是我们可以编写简单的检查并决定如何处理适合的情况我们特定的结果数据结构。

.has <- function(x, what) 
  !is.null(attr(x,what))

hasWarning <- function(x) .has(x, "factory-warning")
hasError <- function(x) .has(x, "factory-error")
isClean <- function(x) !(hasError(x) | hasWarning(x))

【讨论】:

示例中的 f.log(10) 打印“工厂函数中发生错误”,而不是按预期返回结果。但是 isClean() 正确报告为 TRUE。那么你能得到返回值还是只用于错误和警告检查?​​ @ZakKeirn 我无法使用 R 3.5.1 复制您的问题。请仔细检查复制和粘贴过程中是否有小问题。如果问题仍然存在,请分享有关您的执行环境的更多信息。 R 版本是 3.5.2。我只是复制,粘贴,然后再次运行。如果我第一次运行f.log(10),它会工作并返回一个值。然后如果我运行f.log("a"),然后再次运行f.log(10),它会返回“工厂函数中发生错误”。 啊,这是一个很好的提示。关闭正在更新。我只将它用于函数的每个副本都被调用一次的多核情况。我去看看有没有解决办法。可能在启动时将错误变量更新为 FALSE

以上是关于如何将警告和错误保存为函数的输出?的主要内容,如果未能解决你的问题,请参考以下文章

如何在 Python 中将函数输出保存为 PDF? [关闭]

如何将gcc的错误输出保存到文件

Django日志配配置

如何将每次迭代的输出保存到结构中

如何在递归函数中保存多个输出

将画布保存为 png:是不是可以在 Chrome 中删除 MIME 类型的警告消息?