fused-effects-logger: Logger effect for the `fused-effects` library

[ effect, gpl, library ] [ Propose Tags ] [ Report a vulnerability ]

A logger effect for the `fused-effects` library based on the `monad-logger` api.


[Skip to Readme]

Downloads

Maintainer's Corner

Package maintainers

For package maintainers and hackage trustees

Candidates

Versions [RSS] 0.0.1.1
Dependencies base (>=4.7 && <5), bytestring (>=0.12 && <1), fused-effects (>=1.1 && <2), monad-logger (>=0.3 && <1) [details]
Tested with ghc ==9.10, ghc ==9.8, ghc ==9.6
License GPL-3.0-only
Copyright 2025 drlkf
Author drlkf
Maintainer drlkf@drlkf.net
Category Effect
Home page https://github.com/haskell-github-trust/fused-effects-logger
Bug tracker https://github.com/haskell-github-trust/fused-effects-logger/issues
Source repo head: git clone https://github.com/haskell-github-trust/fused-effects-logger
Uploaded by drlkf at 2025-12-06T22:33:24Z
Distributions
Downloads 1 total (1 in the last 30 days)
Rating (no votes yet) [estimated by Bayesian average]
Your Rating
  • λ
  • λ
  • λ
Status Docs available [build log]
Last success reported on 2025-12-06 [all 1 reports]

Readme for fused-effects-logger-0.0.1.1

[back to package description]

fused-effects-logger

A logger effect for the fused-effects library, based on the monad-logger API.

Usage

In addition to fused-effects-logger, you most probably want to add monad-logger as well in order to use its logging functions.

Here is a simple example to start running a program that logs to stderr:

{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}

module Main (main) where

import Control.Carrier.Lift (runM)
import Control.Carrier.Logger.IO (runStderrLoggerIO)
import Control.Effect.Lift (sendM)
import Control.Monad.Logger (logInfo)

main :: IO ()
main = runM . runStderrLoggerIO $ do
  $(logInfo) "hello from fused-effects-logger"
  sendM (print 42)

It should produce the output:

[Info] hello from fused-effects-logger @(test-logger-0.1.0.0-KTuyx50rxPBAwC1EHp8UuV-test-logger-exe:Main app/Main.hs:13:4)
42

Contributing

Please follow the process describe in RELEASE.md to release new versions to Hackage.