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

[ library, system ] [ Propose Tags ]

See README.md


[Skip to Readme]

Modules

[Index]

Downloads

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.7 && <5.0), exceptions (>=0.8.0 && <0.9.0), monad-control (>=1.0 && <1.1), monad-logger (>=0.3.12 && <0.4.0), mtl (>=2.1 && <2.3), resourcet (>=1.1 && <1.2), text (>=1.1 && <1.3), transformers (>=0.3.0 && <0.5.3.0), transformers-base (>=0.4 && <0.5) [details]
License LicenseRef-Apache
Copyright 2016 Seller Labs
Author Matthew Parsons
Maintainer Matthew Parsons
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-07-17T01:05:07Z
Distributions
Reverse Dependencies 1 direct, 0 indirect [details]
Downloads 7284 total (36 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2016-11-22 [all 1 reports]

Readme for monad-logger-prefix-0.1.3

[back to package description]

monad-logger-prefix

Build Status

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."

The package includes a benchmark demonstrating that there is no performance difference with ordinary logging.