Safe Haskell | None |
---|---|
Language | Haskell2010 |
Haskoin.Store.Cache
Documentation
data CacheConfig Source #
Constructors
CacheConfig | |
Fields
|
Instances
data CacheMetrics Source #
type CacheT = ReaderT (Maybe CacheConfig) Source #
data CacheError Source #
Constructors
RedisError Reply | |
RedisTxError !String | |
LogicError !String |
Instances
Eq CacheError Source # | |
Defined in Haskoin.Store.Cache | |
Show CacheError Source # | |
Defined in Haskoin.Store.Cache Methods showsPrec :: Int -> CacheError -> ShowS # show :: CacheError -> String # showList :: [CacheError] -> ShowS # | |
Generic CacheError Source # | |
Defined in Haskoin.Store.Cache Associated Types type Rep CacheError :: Type -> Type # | |
Exception CacheError Source # | |
Defined in Haskoin.Store.Cache Methods toException :: CacheError -> SomeException # fromException :: SomeException -> Maybe CacheError # displayException :: CacheError -> String # | |
NFData CacheError Source # | |
Defined in Haskoin.Store.Cache Methods rnf :: CacheError -> () | |
type Rep CacheError Source # | |
Defined in Haskoin.Store.Cache type Rep CacheError = D1 ('MetaData "CacheError" "Haskoin.Store.Cache" "haskoin-store-0.52.6-inplace" 'False) (C1 ('MetaCons "RedisError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Reply)) :+: (C1 ('MetaCons "RedisTxError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)) :+: C1 ('MetaCons "LogicError" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'SourceStrict 'DecidedStrict) (Rec0 String)))) |
newCacheMetrics :: MonadIO m => Store -> m CacheMetrics Source #
withCache :: StoreReadBase m => Maybe CacheConfig -> CacheT m a -> m a Source #
connectRedis :: MonadIO m => String -> m Connection Source #
blockRefScore :: BlockRef -> Double Source #
scoreBlockRef :: Double -> BlockRef Source #
type CacheWriter = Mailbox CacheWriterMessage Source #
type CacheWriterInbox = Inbox CacheWriterMessage Source #
cacheNewBlock :: MonadIO m => CacheWriter -> m () Source #
cacheWriter :: (MonadUnliftIO m, MonadLoggerIO m, StoreReadExtra m) => CacheConfig -> CacheWriterInbox -> m () Source #