persistent-zookeeper-0.0.2: Backend for persistent library using Zookeeper.

Safe HaskellNone

Database.Persist.Zookeeper

Synopsis

Documentation

data ZookeeperConf Source

Information required to connect to a Zookeeper server

Constructors

ZookeeperConf 

Fields

zCoord :: String
 
zTimeout :: Timeout
 
zNumStripes :: Int
 
zIdleTime :: NominalDiffTime
 
zMaxResources :: Int
 

type Connection = Pool ZooStatSource

newtype ZookeeperT m a Source

Monad reader transformer keeping Zookeeper connection through out the work

Constructors

ZookeeperT 

Instances

MonadTrans ZookeeperT 
Monad m => Monad (ZookeeperT m) 
Functor m => Functor (ZookeeperT m) 
MonadPlus m => MonadPlus (ZookeeperT m) 
Applicative m => Applicative (ZookeeperT m) 
MonadIO m => MonadIO (ZookeeperT m) 
(Applicative m, Functor m, MonadIO m, MonadBaseControl IO m) => PersistUnique (ZookeeperT m) 
(Applicative m, Functor m, MonadIO m, MonadBaseControl IO m) => PersistStore (ZookeeperT m) 

withZookeeperConn :: (Monad m, MonadIO m) => ZookeeperConf -> (Connection -> m a) -> m aSource

Run a connection reader function against a Zookeeper configuration

thisConnection :: Monad m => ZookeeperT m ConnectionSource

Extracts connection from ZookeeperT monad transformer

data ZookeeperBackend Source

Instances

PathPiece (KeyBackend ZookeeperBackend entity)

ToPathPiece is used to convert a key to/from text

execZookeeperT :: (Read a, Show a, Monad m, MonadIO m) => (Zookeeper -> IO (Either ZKError a)) -> ZookeeperT m aSource