acid-state-0.16.1.1: Add ACID guarantees to any serializable Haskell data structure.
CopyrightPublicDomain
Maintainerlemmih@gmail.com
Portabilitynon-portable (uses GHC extensions)
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.Acid.Core

Description

Low-level controls for transaction-based state changes. This module defines structures and tools for running state modifiers indexed either by an Method or a serialized Method. This module should rarely be used directly although the Method class is needed when defining events manually.

The term 'Event' is loosely used for transactions with ACID guarantees. 'Method' is loosely used for state operations without ACID guarantees

Synopsis

Documentation

data Core st Source #

The control structure at the very center of acid-state. This module provides access to a mutable state through methods. No efforts towards durability, checkpointing or sharding happens at this level. Important things to keep in mind in this module: * We don't distinguish between updates and queries. * We allow direct access to the core state as well as through events.

class Method ev where Source #

The basic Method class. Each Method has an indexed result type and a unique tag.

Minimal complete definition

Nothing

Associated Types

type MethodResult ev Source #

type MethodState ev Source #

Methods

methodTag :: ev -> Tag Source #

default methodTag :: Typeable ev => ev -> Tag Source #

data MethodContainer st where Source #

Method container structure that hides the exact type of the method.

Constructors

Method :: Method method => MethodBody method -> MethodSerialiser method -> MethodContainer (MethodState method) 

type Tagged a = (Tag, a) Source #

mkCore Source #

Arguments

:: [MethodContainer st]

List of methods capable of modifying the state.

-> st

Initial state value.

-> IO (Core st) 

Construct a new Core using an initial state and a list of Methods.

closeCore :: Core st -> IO () Source #

Mark Core as closed. Any subsequent use will throw an exception.

closeCore' :: Core st -> (st -> IO ()) -> IO () Source #

Access the state and then mark the Core as closed. Any subsequent use will throw an exception.

modifyCoreState :: Core st -> (st -> IO (st, a)) -> IO a Source #

Modify the state component. The resulting state is ensured to be in WHNF.

modifyCoreState_ :: Core st -> (st -> IO st) -> IO () Source #

Modify the state component. The resulting state is ensured to be in WHNF.

withCoreState :: Core st -> (st -> IO a) -> IO a Source #

Access the state component.

lookupHotMethod :: Method method => MethodMap (MethodState method) -> method -> State (MethodState method) (MethodResult method) Source #

Find the state action that corresponds to an in-memory method.

lookupHotMethodAndSerialiser :: Method method => MethodMap (MethodState method) -> method -> (State (MethodState method) (MethodResult method), MethodSerialiser method) Source #

Find the state action and serialiser that correspond to an in-memory method.

lookupColdMethod :: Core st -> Tagged ByteString -> State st ByteString Source #

Find the state action that corresponds to a tagged and serialized method.

runHotMethod :: Method method => Core (MethodState method) -> method -> IO (MethodResult method) Source #

Apply an in-memory method to the state.

runColdMethod :: Core st -> Tagged ByteString -> IO ByteString Source #

Execute a method as given by a type identifier and an encoded string. The exact format of the encoded string depends on the type identifier. Results are encoded and type tagged before they're handed back out. This function is used when running events from a log-file or from another server. Events that originate locally are most likely executed with the faster runHotMethod.

type MethodMap st = Map Tag (MethodContainer st) Source #

Collection of Methods indexed by a Tag.

mkMethodMap :: [MethodContainer st] -> MethodMap st Source #

Construct a MethodMap from a list of Methods using their associated tag.

data Serialiser a Source #

Interface for (de)serialising values of type a.

A Serialiser { serialiserEncode, serialiserDecode } must satisfy the round-trip property:

forall x . serialiserDecode (serialiserEncode x) == Right x

Constructors

Serialiser 

Fields

safeCopySerialiser :: SafeCopy a => Serialiser a Source #

Default implementation of Serialiser interface using SafeCopy.

data MethodSerialiser method Source #

Interface for (de)serialising a method, namely Serialisers for its arguments type and its result type.

safeCopyMethodSerialiser :: (SafeCopy method, SafeCopy (MethodResult method)) => MethodSerialiser method Source #

Default implementation of MethodSerialiser interface using SafeCopy.

encodeMethod :: MethodSerialiser method -> method -> ByteString Source #

Encode the arguments of a method using the given serialisation strategy.

decodeMethod :: MethodSerialiser method -> ByteString -> Either String method Source #

Decode the arguments of a method using the given serialisation strategy.

encodeResult :: MethodSerialiser method -> MethodResult method -> ByteString Source #

Encode the result of a method using the given serialisation strategy.

decodeResult :: MethodSerialiser method -> ByteString -> Either String (MethodResult method) Source #

Decode the result of a method using the given serialisation strategy.