web-dev-qa-db-ja.com

警告とエラーを関数の出力として保存するにはどうすればよいですか?

lapplyを使用して多数のアイテムに対して複雑な関数を実行しています。各アイテムの出力(ある場合)と、生成された警告/エラーを一緒に保存して、どのアイテムがどの警告/エラーを生成したかを知ることができます。

withCallingHandlersを使用して警告をキャッチする方法を見つけました( ここに説明されています )。ただし、エラーもキャッチする必要があります。 (以下のコードのように)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とエラー処理について説明していますが、この特定の問題に対処するために見つけた質問はありません。 を参照してください。方法warnings()が関数内で機能しない?これを回避するにはどうすればよいですか? 、および lapplyにエラーを無視してリストの次の処理を行うように指示する方法 で最も関連性の高いものを検索します。

多分これはあなたの解決策と同じですが、私は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)
_
46
Martin Morgan

パッケージの評価 を試してください。

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)

また、メッセージをキャプチャしてコンソールに出力し、すべてが発生順に正しくインターリーブされるようにします。

18
hadley

Martinsソリューション( https://stackoverflow.com/a/4952908/2161065 )と、demo(error.catching)で取得したR-helpメーリングリストからのソリューションをマージしました。

主な考え方は、警告/エラーメッセージと、この問題をトリガーするコマンドの両方を保持することです。

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))

$ value [1] 0 $ warning NULL $ error NULL

> myTryCatch(log(-1))

$ value [1] NaN $ warning $ error NULL

> myTryCatch(log( "a"))

$ value NULL $ warning NULL $ error

11
user2161065

私の回答(およびマーティンの優れたコードへの変更)の目的は、すべてがうまくいった場合に期待されるデータ構造をファクトリー関数が返すようにすることです。警告が発生した場合、それは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
#' \url{http://stackoverflow.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))
7
russellpierce