hslogger-1.3.1.0: Versatile logging framework

CopyrightCopyright (C) 2004-2011 John Goerzen
LicenseBSD3
Portabilityportable
Safe HaskellSafe
LanguageHaskell2010

System.Log

Contents

Description

Haskell Logging Framework

Written by John Goerzen, jgoerzen@complete.org

This module defines basic types used for logging.

Extensive documentation is available in System.Log.Logger.

Synopsis

Types

data Priority Source #

Priorities are used to define how important a log message is. Users can filter log messages based on priorities.

These have their roots on the traditional syslog system. The standard definitions are given below, but you are free to interpret them however you like. They are listed here in ascending importance order.

Constructors

DEBUG

Debug messages

INFO

Information

NOTICE

Normal runtime conditions

WARNING

General Warnings

ERROR

General Errors

CRITICAL

Severe situations

ALERT

Take immediate action

EMERGENCY

System is unusable

Instances
Bounded Priority Source # 
Instance details

Defined in System.Log

Enum Priority Source # 
Instance details

Defined in System.Log

Eq Priority Source # 
Instance details

Defined in System.Log

Data Priority Source # 
Instance details

Defined in System.Log

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Priority -> c Priority #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Priority #

toConstr :: Priority -> Constr #

dataTypeOf :: Priority -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Priority) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Priority) #

gmapT :: (forall b. Data b => b -> b) -> Priority -> Priority #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Priority -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Priority -> r #

gmapQ :: (forall d. Data d => d -> u) -> Priority -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Priority -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Priority -> m Priority #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Priority -> m Priority #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Priority -> m Priority #

Ord Priority Source # 
Instance details

Defined in System.Log

Read Priority Source # 
Instance details

Defined in System.Log

Show Priority Source # 
Instance details

Defined in System.Log

Generic Priority Source # 
Instance details

Defined in System.Log

Associated Types

type Rep Priority :: Type -> Type #

Methods

from :: Priority -> Rep Priority x #

to :: Rep Priority x -> Priority #

NFData Priority Source #

Since: 1.3.1.0

Instance details

Defined in System.Log

Methods

rnf :: Priority -> () #

type Rep Priority Source # 
Instance details

Defined in System.Log

type Rep Priority = D1 (MetaData "Priority" "System.Log" "hslogger-1.3.1.0-DmGQNXFaR77Fqc2qmwKhmf" False) (((C1 (MetaCons "DEBUG" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "INFO" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NOTICE" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WARNING" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "ERROR" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CRITICAL" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "ALERT" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EMERGENCY" PrefixI False) (U1 :: Type -> Type))))

type LogRecord = (Priority, String) Source #

Internal type of log records