monad-logger-prefix: Add prefixes to your monad-logger output

[ library, system ] [ Propose Tags ]

See README.md


[Skip to Readme]

Modules

[Last Documentation]

  • Control
    • Monad
      • Logger
        • Control.Monad.Logger.Prefix

Downloads

Note: This package has metadata revisions in the cabal description newer than included in the tarball. To unpack the package including the revisions, use 'cabal get'.

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

  • No Candidates
Versions [RSS] 0.1.0, 0.1.1, 0.1.2, 0.1.3, 0.1.4, 0.1.5, 0.1.6, 0.1.7, 0.1.8, 0.1.9, 0.1.10, 0.1.11, 0.1.12
Change log CHANGELOG.md
Dependencies base (>=4.8 && <4.9), exceptions, monad-control, monad-logger, mtl, text, transformers, transformers-base [details]
License LicenseRef-Apache
Copyright 2016 Seller Labs
Author
Maintainer Matthew Parsons
Revised Revision 1 made by parsonsmatt at 2016-06-29T20:32:06Z
Category System
Home page https://github.com/sellerlabs/monad-logger-prefix#readme
Bug tracker https://github.com/sellerlabs/monad-logger-prefix/issues
Source repo head: git clone https://github.com/sellerlabs/monad-logger-prefix
Uploaded by parsonsmatt at 2016-06-29T20:26:42Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 7320 total (38 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs not available [build log]
All reported builds failed as of 2016-11-23 [all 2 reports]

Readme for monad-logger-prefix-0.1.0

[back to package description]

monad-logger-prefix

This package provides an easy way to add prefixes to any MonadLogger. Here's a brief example:

{-# LANGUAGE TemplateHaskell #-}

import Control.Monad.Logger
import Control.Monad.Logger.Prefix

main :: IO ()
main = runStdoutLoggingT $ do
    $(logDebug) "This one has no prefix."

    "foo" `prefixLogs` do
        $(logDebug) "This one has a [foo] prefix."

        "bar" `prefixLogs` do
            $(logDebug) "This one has both [foo] and [bar] prefixes."