{-# LANGUAGE ConstraintKinds #-}
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE GADTs #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE TypeOperators #-}
{-# LANGUAGE AllowAmbiguousTypes #-}
module Colog.Polysemy.Formatting.WithLog
( WithLog'
, WithLog
) where
import Colog (Msg(..), Severity(..))
import Colog.Polysemy (Log(..))
import GHC.Stack (HasCallStack)
import Polysemy
type WithLog' msg r = (HasCallStack, Member (Log msg) r)
type WithLog r = WithLog' (Msg Severity) r