Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
class PrettyPrintable a where Source
PrettyPrintable (PatExprDirError a) Source | |
PrettyPrintable (GetError s v) Source | |
PrettyPrintable (PutError s v) Source |
data PutError :: * -> * -> * where Source
incrBranchNo :: PutError s v -> PutError s v Source
data GetError :: * -> * -> * where Source
GFail :: String -> GetError s v | |
GSourcePatternMismatch :: PatExprDirError s -> GetError s v | |
GUnevalFailed :: PatExprDirError s' -> GetError s v | |
GViewRecoveringIncomplete :: PatExprDirError v' -> GetError s v | |
GCaseExhausted :: [GetError s v] -> GetError s v | |
GPreviousBranchMatched :: GetError s v | |
GPostVerificationFailed :: GetError s v | |
GBranchUnmatched :: GetError s v | |
GAdaptiveBranchMatched :: GetError s v | |
GProdLeft :: s -> GetError s v -> GetError (s, s') (v, v') | |
GProdRight :: s' -> GetError s' v' -> GetError (s, s') (v, v') | |
GRearrS :: s' -> GetError s' v -> GetError s v | |
GRearrV :: s -> GetError s v' -> GetError s v | |
GDep :: s -> GetError s v -> GetError s (v, v') | |
GComposeLeft :: a -> GetError a b -> GetError a c | |
GComposeRight :: b -> GetError b c -> GetError a c | |
GBranch :: Int -> GetError s v -> GetError s v |
addCurrentBranchError :: GetError s v -> GetError s v -> GetError s v Source
data PatExprDirError :: * -> * where Source
PEDConstantMismatch :: PatExprDirError a | |
PEDEitherMismatch :: PatExprDirError (Either a b) | |
PEDValueUnrecoverable :: PatExprDirError a | |
PEDIncompatibleUpdates :: a -> a -> PatExprDirError a | |
PEDMultipleUpdates :: a -> a -> PatExprDirError a | |
PEDProdLeft :: PatExprDirError a -> PatExprDirError (a, b) | |
PEDProdRight :: PatExprDirError b -> PatExprDirError (a, b) | |
PEDEitherLeft :: PatExprDirError a -> PatExprDirError (Either a b) | |
PEDEitherRight :: PatExprDirError b -> PatExprDirError (Either a b) | |
PEDIn :: InOut a => PatExprDirError (F a) -> PatExprDirError a |