module System.Logger.Types
(
LogLevel(..)
, logLevelText
, readLogLevel
, pLogLevel
, LogPolicy(..)
, logPolicyText
, readLogPolicy
, pLogPolicy
, LogLabel
, LogScope
, LogMessage(..)
, logMsg
, logMsgLevel
, logMsgScope
, LoggerBackend
, LogFunction
, LogFunctionIO
, LoggerCtx(..)
, LoggerCtxT
, runLoggerCtxT
, MonadLog(..)
) where
import Configuration.Utils hiding (Lens', Error)
import Control.DeepSeq
import Control.Lens hiding ((.=))
import Control.Monad.Base
import Control.Monad.Except
import Control.Monad.Reader
import Control.Monad.Trans.Control
import Control.Monad.Trans.Either
import Control.Monad.State
import Control.Monad.Trans.Trace
import Control.Monad.Writer
import Control.Monad.Unicode
import qualified Data.CaseInsensitive as CI
import Data.Monoid.Unicode
import Data.String
import qualified Data.Text as T
import Data.Text.Lens
import Data.Typeable
import GHC.Generics
import qualified Options.Applicative as O
import Prelude.Unicode
data LogLevel
= Quiet
| Error
| Warn
| Info
| Debug
deriving (Show, Read, Eq, Ord, Enum, Bounded, Typeable, Generic)
instance NFData LogLevel
readLogLevel
∷ (MonadError e m, Eq a, Show a, CI.FoldCase a, IsString a, IsString e, Monoid e)
⇒ a
→ m LogLevel
readLogLevel x = case CI.mk x of
"quiet" → return Quiet
"error" → return Error
"warn" → return Warn
"info" → return Info
"debug" → return Debug
e → throwError $ "unexpected log level value: "
⊕ fromString (show e)
⊕ ", expected \"quiet\", \"error\", \"warn\", \"info\", or \"debug\""
logLevelText
∷ IsString a
⇒ LogLevel
→ a
logLevelText Quiet = "quiet"
logLevelText Error = "error"
logLevelText Warn = "warn"
logLevelText Info = "info"
logLevelText Debug = "debug"
instance ToJSON LogLevel where
toJSON = String ∘ logLevelText
instance FromJSON LogLevel where
parseJSON = withText "LogLevel" $ either fail return ∘ readLogLevel
pLogLevel ∷ O.Parser LogLevel
pLogLevel = option (eitherReader readLogLevel)
× long "loglevel"
⊕ metavar "quiet|error|warn|info|debug"
⊕ help "threshold for log messages"
data LogPolicy
= LogPolicyDiscard
| LogPolicyRaise
| LogPolicyBlock
deriving (Show, Read, Eq, Ord, Bounded, Enum, Typeable, Generic)
logPolicyText ∷ IsString s ⇒ LogPolicy → s
logPolicyText LogPolicyDiscard = "discard"
logPolicyText LogPolicyRaise = "raise"
logPolicyText LogPolicyBlock = "block"
readLogPolicy
∷ (MonadError e m, Eq a, Show a, CI.FoldCase a, IsText a, IsString e, Monoid e)
⇒ a
→ m LogPolicy
readLogPolicy x = case CI.mk tx of
"discard" → return LogPolicyDiscard
"raise" → return LogPolicyRaise
"block" → return LogPolicyBlock
e → throwError
$ "invalid log policy value " ⊕ fromString (show e) ⊕ ";"
⊕ " the log policy value must be one of \"discard\", \"raise\", or \"block\""
where
tx = packed # x
instance ToJSON LogPolicy where
toJSON = toJSON ∘ (logPolicyText ∷ LogPolicy → T.Text)
instance FromJSON LogPolicy where
parseJSON = withText "LogPolicy" $ either fail return ∘ readLogPolicy
pLogPolicy ∷ O.Parser LogPolicy
pLogPolicy = option (eitherReader readLogPolicy)
× long "log-policy"
⊕ metavar "block|raise|discard"
⊕ help "how to deal with a congested logging pipeline"
type LogLabel = (T.Text, T.Text)
type LogScope = [LogLabel]
data LogMessage a = LogMessage
{ _logMsg ∷ !a
, _logMsgLevel ∷ !LogLevel
, _logMsgScope ∷ !LogScope
}
deriving (Show, Read, Eq, Ord, Typeable, Generic)
logMsg ∷ Lens' (LogMessage a) a
logMsg = lens _logMsg $ \a b → a { _logMsg = b }
logMsgLevel ∷ Lens' (LogMessage a) LogLevel
logMsgLevel = lens _logMsgLevel $ \a b → a { _logMsgLevel = b }
logMsgScope ∷ Lens' (LogMessage a) LogScope
logMsgScope = lens _logMsgScope $ \a b → a { _logMsgScope = b }
instance NFData a ⇒ NFData (LogMessage a)
type LoggerBackend a = Either (LogMessage T.Text) (LogMessage a) → IO ()
type LogFunctionIO a = LogLevel → a → IO ()
type LogFunction a m = LogLevel → a → m ()
class Monad m ⇒ MonadLog a m | m → a where
logg ∷ LogFunction a m
withLevel ∷ LogLevel → m α → m α
withLabel ∷ LogLabel → m α → m α
withPolicy ∷ LogPolicy → m α → m α
instance (Show a, Typeable a, NFData a, MonadIO m, LoggerCtx ctx a, MonadReader ctx m) ⇒ MonadLog a m where
logg l m = ask ≫= \ctx → liftIO (loggerFunIO ctx l m)
withLevel level = local $ setLoggerLevel .~ level
withLabel label = local $ setLoggerScope %~ (:) label
withPolicy policy = local $ setLoggerPolicy .~ policy
instance MonadLog a m ⇒ MonadLog a (ReaderT σ m) where
logg l = lift ∘ logg l
withLevel level inner = liftWith (\run → withLevel level (run inner)) ≫= restoreT ∘ return
withLabel label inner = liftWith (\run → withLabel label (run inner)) ≫= restoreT ∘ return
withPolicy policy inner = liftWith (\run → withPolicy policy (run inner)) ≫= restoreT ∘ return
instance (Monoid σ, MonadLog a m) ⇒ MonadLog a (WriterT σ m) where
logg l = lift ∘ logg l
withLevel level inner = liftWith (\run → withLevel level (run inner)) ≫= restoreT ∘ return
withLabel label inner = liftWith (\run → withLabel label (run inner)) ≫= restoreT ∘ return
withPolicy policy inner = liftWith (\run → withPolicy policy (run inner)) ≫= restoreT ∘ return
instance (MonadLog a m) ⇒ MonadLog a (ExceptT ε m) where
logg l = lift ∘ logg l
withLevel level inner = liftWith (\run → withLevel level (run inner)) ≫= restoreT ∘ return
withLabel label inner = liftWith (\run → withLabel label (run inner)) ≫= restoreT ∘ return
withPolicy policy inner = liftWith (\run → withPolicy policy (run inner)) ≫= restoreT ∘ return
instance (MonadLog a m) ⇒ MonadLog a (StateT σ m) where
logg l = lift ∘ logg l
withLevel level inner = liftWith (\run → withLevel level (run inner)) ≫= restoreT ∘ return
withLabel label inner = liftWith (\run → withLabel label (run inner)) ≫= restoreT ∘ return
withPolicy policy inner = liftWith (\run → withPolicy policy (run inner)) ≫= restoreT ∘ return
instance (MonadLog a m) ⇒ MonadLog a (TraceT t e m) where
logg l = lift ∘ logg l
withLevel level inner = liftWith (\run → withLevel level (run inner)) ≫= restoreT ∘ return
withLabel label inner = liftWith (\run → withLabel label (run inner)) ≫= restoreT ∘ return
withPolicy policy inner = liftWith (\run → withPolicy policy (run inner)) ≫= restoreT ∘ return
instance (MonadLog a m) ⇒ MonadLog a (EitherT σ m) where
logg l = lift ∘ logg l
withLevel level inner = liftWith (\run → withLevel level (run inner)) ≫= restoreT ∘ return
withLabel label inner = liftWith (\run → withLabel label (run inner)) ≫= restoreT ∘ return
withPolicy policy inner = liftWith (\run → withPolicy policy (run inner)) ≫= restoreT ∘ return
class LoggerCtx ctx msg | ctx → msg where
loggerFunIO
∷ (Show msg, Typeable msg, NFData msg)
⇒ ctx
→ LogFunctionIO msg
setLoggerLevel ∷ Setter' ctx LogLevel
setLoggerScope ∷ Setter' ctx LogScope
setLoggerPolicy ∷ Setter' ctx LogPolicy
withLoggerLevel ∷ LogLevel → ctx → (ctx → α) → α
withLoggerLevel level ctx f = f $ ctx & setLoggerLevel .~ level
withLoggerLabel ∷ LogLabel → ctx → (ctx → α) → α
withLoggerLabel label ctx f = f $ ctx & setLoggerScope %~ (:) label
withLoggerPolicy ∷ LogPolicy → ctx → (ctx → α) → α
withLoggerPolicy policy ctx f = f $ ctx & setLoggerPolicy .~ policy
newtype LoggerCtxT ctx m α = LoggerCtxT { unLoggerCtxT ∷ ReaderT ctx m α }
deriving (Functor, Applicative, Monad, MonadIO, MonadTrans, MonadReader ctx, MonadError a, MonadState a, MonadWriter a, MonadBase a)
instance MonadTransControl (LoggerCtxT ctx) where
type StT (LoggerCtxT ctx) a = StT (ReaderT ctx) a
liftWith = defaultLiftWith LoggerCtxT unLoggerCtxT
restoreT = defaultRestoreT LoggerCtxT
instance MonadBaseControl b m ⇒ MonadBaseControl b (LoggerCtxT ctx m) where
type StM (LoggerCtxT ctx m) a = ComposeSt (LoggerCtxT ctx) m a
liftBaseWith = defaultLiftBaseWith
restoreM = defaultRestoreM
runLoggerCtxT
∷ LoggerCtxT ctx m α
→ ctx
→ m α
runLoggerCtxT = runReaderT ∘ unLoggerCtxT
instance (Show a, Typeable a, NFData a, MonadIO m, LoggerCtx ctx a) ⇒ MonadLog a (LoggerCtxT ctx m) where
logg l m = ask ≫= \ctx → liftIO (loggerFunIO ctx l m)
withLevel level = local $ setLoggerLevel .~ level
withLabel label = local $ setLoggerScope %~ (:) label
withPolicy policy = local $ setLoggerPolicy .~ policy