Safe Haskell | None |
---|---|
Language | Haskell2010 |
An exception hierarchy that can be used with the Haxl
monad.
The Haxl framework may throw exceptions from this hierarchy: for
example, a misbehaving data source causes dataFetch
to throw a
DataSourceError
. The combinator withDefault
from
Haxl.Core.Prelude uses this hierarchy to provide default values
for expressions that raise TransientError
or LogicError
exceptions.
You are under no obligations to use this hierarchy for your own
exceptions, but you might find it useful nonetheless; for
withDefault
to be useful, for example, you'll want your
exceptions to be children of LogicError
or TransientError
as
appropriate.
Most users should import Haxl.Core instead of importing this module directly.
Synopsis
- data HaxlException = MiddleException e => HaxlException (Maybe Stack) e
- data InternalError = Exception e => InternalError e
- internalErrorToException :: Exception e => e -> SomeException
- internalErrorFromException :: Exception e => SomeException -> Maybe e
- data LogicError = Exception e => LogicError e
- logicErrorToException :: Exception e => e -> SomeException
- logicErrorFromException :: Exception e => SomeException -> Maybe e
- data LogicBug = Exception e => LogicBug e
- logicBugToException :: Exception e => e -> SomeException
- logicBugFromException :: Exception e => SomeException -> Maybe e
- data TransientError = Exception e => TransientError e
- transientErrorToException :: Exception e => e -> SomeException
- transientErrorFromException :: Exception e => SomeException -> Maybe e
- newtype CriticalError = CriticalError Text
- newtype DataSourceError = DataSourceError Text
- newtype NonHaxlException = NonHaxlException Text
- newtype NotFound = NotFound Text
- newtype UnexpectedType = UnexpectedType Text
- newtype EmptyList = EmptyList Text
- newtype JSONError = JSONError Text
- newtype InvalidParameter = InvalidParameter Text
- newtype MonadFail = MonadFail Text
- newtype FetchError = FetchError Text
- asHaxlException :: SomeException -> HaxlException
- class Exception a => MiddleException a where
- rethrowAsyncExceptions :: SomeException -> IO ()
- tryWithRethrow :: IO a -> IO (Either SomeException a)
Documentation
data HaxlException Source #
We have a 3-tiered hierarchy of exceptions, with HaxlException
at
the top, and all Haxl exceptions as children of this. Users should
never deal directly with HaxlException
s.
The main types of exceptions are:
InternalError
- Something is wrong with Haxl core.
LogicBug
- Something is wrong with Haxl client code.
LogicError
- Things that really should be return values, e.g. NotFound.
TransientError
- Something is temporarily failing (usually in a fetch).
These are not meant to be thrown (but likely be caught). Thrown
exceptions should be a subclass of one of these. There are some
generic leaf exceptions defined below this, such as FetchError
(generic transient failure) or CriticalError
(internal failure).
MiddleException e => HaxlException (Maybe Stack) e |
Instances
Show HaxlException Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> HaxlException -> ShowS # show :: HaxlException -> String # showList :: [HaxlException] -> ShowS # | |
ToJSON HaxlException Source # | These need to be serializable to JSON to cross FFI boundaries. |
Defined in Haxl.Core.Exception toJSON :: HaxlException -> Value # toEncoding :: HaxlException -> Encoding # toJSONList :: [HaxlException] -> Value # toEncodingList :: [HaxlException] -> Encoding # | |
Exception HaxlException Source # | |
Defined in Haxl.Core.Exception |
Exception categories
data InternalError Source #
For errors in Haxl core code.
Exception e => InternalError e |
Instances
Show InternalError Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> InternalError -> ShowS # show :: InternalError -> String # showList :: [InternalError] -> ShowS # | |
Exception InternalError Source # | |
Defined in Haxl.Core.Exception | |
MiddleException InternalError Source # | |
Defined in Haxl.Core.Exception eName :: InternalError -> String Source # |
internalErrorToException :: Exception e => e -> SomeException Source #
internalErrorFromException :: Exception e => SomeException -> Maybe e Source #
data LogicError Source #
For errors in Haxl client code.
Exception e => LogicError e |
Instances
Show LogicError Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> LogicError -> ShowS # show :: LogicError -> String # showList :: [LogicError] -> ShowS # | |
Exception LogicError Source # | |
Defined in Haxl.Core.Exception toException :: LogicError -> SomeException # fromException :: SomeException -> Maybe LogicError # displayException :: LogicError -> String # | |
MiddleException LogicError Source # | |
Defined in Haxl.Core.Exception eName :: LogicError -> String Source # |
logicErrorToException :: Exception e => e -> SomeException Source #
logicErrorFromException :: Exception e => SomeException -> Maybe e Source #
Instances
Show LogicBug Source # | |
Exception LogicBug Source # | |
Defined in Haxl.Core.Exception toException :: LogicBug -> SomeException # fromException :: SomeException -> Maybe LogicBug # displayException :: LogicBug -> String # | |
MiddleException LogicBug Source # | |
logicBugToException :: Exception e => e -> SomeException Source #
logicBugFromException :: Exception e => SomeException -> Maybe e Source #
data TransientError Source #
For transient failures.
Exception e => TransientError e |
Instances
Show TransientError Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> TransientError -> ShowS # show :: TransientError -> String # showList :: [TransientError] -> ShowS # | |
Exception TransientError Source # | |
Defined in Haxl.Core.Exception | |
MiddleException TransientError Source # | |
Defined in Haxl.Core.Exception eName :: TransientError -> String Source # |
transientErrorToException :: Exception e => e -> SomeException Source #
transientErrorFromException :: Exception e => SomeException -> Maybe e Source #
Internal exceptions
newtype CriticalError Source #
Generic "critical" exception. Something internal is borked. Panic.
Instances
Eq CriticalError Source # | |
Defined in Haxl.Core.Exception (==) :: CriticalError -> CriticalError -> Bool # (/=) :: CriticalError -> CriticalError -> Bool # | |
Show CriticalError Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> CriticalError -> ShowS # show :: CriticalError -> String # showList :: [CriticalError] -> ShowS # | |
Exception CriticalError Source # | |
Defined in Haxl.Core.Exception | |
Binary CriticalError Source # | |
Defined in Haxl.Core.Exception |
newtype DataSourceError Source #
A data source did something wrong
Instances
Eq DataSourceError Source # | |
Defined in Haxl.Core.Exception (==) :: DataSourceError -> DataSourceError -> Bool # (/=) :: DataSourceError -> DataSourceError -> Bool # | |
Show DataSourceError Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> DataSourceError -> ShowS # show :: DataSourceError -> String # showList :: [DataSourceError] -> ShowS # | |
Exception DataSourceError Source # | |
Defined in Haxl.Core.Exception |
newtype NonHaxlException Source #
Exceptions that are converted to HaxlException by
asHaxlException. Typically these will be pure exceptions,
e.g., the error
function in pure code, or a pattern-match
failure.
Instances
Eq NonHaxlException Source # | |
Defined in Haxl.Core.Exception (==) :: NonHaxlException -> NonHaxlException -> Bool # (/=) :: NonHaxlException -> NonHaxlException -> Bool # | |
Show NonHaxlException Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> NonHaxlException -> ShowS # show :: NonHaxlException -> String # showList :: [NonHaxlException] -> ShowS # | |
Exception NonHaxlException Source # | |
Defined in Haxl.Core.Exception | |
Binary NonHaxlException Source # | |
Defined in Haxl.Core.Exception |
Logic exceptions
Generic "something was not found" exception.
Instances
Eq NotFound Source # | |
Show NotFound Source # | |
Exception NotFound Source # | |
Defined in Haxl.Core.Exception toException :: NotFound -> SomeException # fromException :: SomeException -> Maybe NotFound # displayException :: NotFound -> String # | |
Binary NotFound Source # | |
newtype UnexpectedType Source #
Generic "something had the wrong type" exception.
Instances
Eq UnexpectedType Source # | |
Defined in Haxl.Core.Exception (==) :: UnexpectedType -> UnexpectedType -> Bool # (/=) :: UnexpectedType -> UnexpectedType -> Bool # | |
Show UnexpectedType Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> UnexpectedType -> ShowS # show :: UnexpectedType -> String # showList :: [UnexpectedType] -> ShowS # | |
Exception UnexpectedType Source # | |
Defined in Haxl.Core.Exception |
Generic "input list was empty" exception.
Instances
Eq EmptyList Source # | |
Show EmptyList Source # | |
Exception EmptyList Source # | |
Defined in Haxl.Core.Exception toException :: EmptyList -> SomeException # fromException :: SomeException -> Maybe EmptyList # displayException :: EmptyList -> String # |
Generic "Incorrect assumptions about JSON data" exception.
Instances
Eq JSONError Source # | |
Show JSONError Source # | |
Exception JSONError Source # | |
Defined in Haxl.Core.Exception toException :: JSONError -> SomeException # fromException :: SomeException -> Maybe JSONError # displayException :: JSONError -> String # |
newtype InvalidParameter Source #
Generic "passing some invalid parameter" exception.
Instances
Eq InvalidParameter Source # | |
Defined in Haxl.Core.Exception (==) :: InvalidParameter -> InvalidParameter -> Bool # (/=) :: InvalidParameter -> InvalidParameter -> Bool # | |
Show InvalidParameter Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> InvalidParameter -> ShowS # show :: InvalidParameter -> String # showList :: [InvalidParameter] -> ShowS # | |
Exception InvalidParameter Source # | |
Defined in Haxl.Core.Exception |
Generic "fail was called" exception.
Instances
Eq MonadFail Source # | |
Show MonadFail Source # | |
Exception MonadFail Source # | |
Defined in Haxl.Core.Exception toException :: MonadFail -> SomeException # fromException :: SomeException -> Maybe MonadFail # displayException :: MonadFail -> String # |
Transient exceptions
newtype FetchError Source #
Generic transient fetching exceptions.
Instances
Eq FetchError Source # | |
Defined in Haxl.Core.Exception (==) :: FetchError -> FetchError -> Bool # (/=) :: FetchError -> FetchError -> Bool # | |
Show FetchError Source # | |
Defined in Haxl.Core.Exception showsPrec :: Int -> FetchError -> ShowS # show :: FetchError -> String # showList :: [FetchError] -> ShowS # | |
Exception FetchError Source # | |
Defined in Haxl.Core.Exception toException :: FetchError -> SomeException # fromException :: SomeException -> Maybe FetchError # displayException :: FetchError -> String # |
Exception utilities
asHaxlException :: SomeException -> HaxlException Source #
Converts all exceptions that are not derived from HaxlException
into NonHaxlException
, using show
.
class Exception a => MiddleException a where Source #
Instances
MiddleException LogicBug Source # | |
MiddleException LogicError Source # | |
Defined in Haxl.Core.Exception eName :: LogicError -> String Source # | |
MiddleException InternalError Source # | |
Defined in Haxl.Core.Exception eName :: InternalError -> String Source # | |
MiddleException TransientError Source # | |
Defined in Haxl.Core.Exception eName :: TransientError -> String Source # |
rethrowAsyncExceptions :: SomeException -> IO () Source #
tryWithRethrow :: IO a -> IO (Either SomeException a) Source #