Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
type CounterKey = String Source #
newtype CounterValue Source #
Instances
Generic CounterValue Source # | |
Defined in Arbor.Monad.Counter.Type type Rep CounterValue :: * -> * # from :: CounterValue -> Rep CounterValue x # to :: Rep CounterValue x -> CounterValue # | |
type Rep CounterValue Source # | |
Defined in Arbor.Monad.Counter.Type type Rep CounterValue = D1 (MetaData "CounterValue" "Arbor.Monad.Counter.Type" "arbor-monad-counter-2.0.0-HKJ9Ts9HkU0KXouov1vWpx" True) (C1 (MetaCons "CounterValue" PrefixI True) (S1 (MetaSel (Just "var") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (TVar Int)))) |
type CountersMap = Map CounterKey CounterValue Source #
Instances
Generic Counters Source # | |
type Rep Counters Source # | |
Defined in Arbor.Monad.Counter.Type type Rep Counters = D1 (MetaData "Counters" "Arbor.Monad.Counter.Type" "arbor-monad-counter-2.0.0-HKJ9Ts9HkU0KXouov1vWpx" False) (C1 (MetaCons "Counters" PrefixI True) (S1 (MetaSel (Just "current") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CountersMap) :*: (S1 (MetaSel (Just "previous") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CountersMap) :*: S1 (MetaSel (Just "total") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 CountersMap)))) |
class (Monad m, MonadIO m) => MonadCounters m where Source #
getCounters :: m Counters Source #
Instances
MonadCounters m => MonadCounters (MaybeT m) Source # | |
Defined in Arbor.Monad.Counter.Type getCounters :: MaybeT m Counters Source # | |
MonadCounters m => MonadCounters (ResourceT m) Source # | |
Defined in Arbor.Monad.Counter.Type getCounters :: ResourceT m Counters Source # | |
MonadCounters m => MonadCounters (IdentityT m) Source # | |
Defined in Arbor.Monad.Counter.Type getCounters :: IdentityT m Counters Source # | |
MonadCounters m => MonadCounters (ExceptT e m) Source # | |
Defined in Arbor.Monad.Counter.Type getCounters :: ExceptT e m Counters Source # | |
MonadCounters m => MonadCounters (StateT s m) Source # | |
Defined in Arbor.Monad.Counter.Type getCounters :: StateT s m Counters Source # | |
MonadCounters m => MonadCounters (ReaderT e m) Source # | |
Defined in Arbor.Monad.Counter.Type getCounters :: ReaderT e m Counters Source # |