sdl2-2.4.0.1: Both high- and low-level bindings to the SDL library (version 2.0.4+).

Safe HaskellSafe
LanguageHaskell2010

SDL.Exception

Synopsis

Documentation

data SDLException Source #

Error details about a failure to call an SDL routine. Almost all functions in this library have the ability to produce exceptions of this type. Inspection should help you learn more about what has gone wrong.

Constructors

SDLCallFailed

A call to a low-level SDL C function failed unexpectedly.

Fields

SDLUnexpectedArgument

An SDL C function was called with an unexpected argument.

Fields

SDLUnknownHintValue

A hint was attempted to be set, but SDL does not know about this hint.

Fields

Instances
Eq SDLException Source # 
Instance details
Data SDLException Source # 
Instance details

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SDLException -> c SDLException #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SDLException #

toConstr :: SDLException -> Constr #

dataTypeOf :: SDLException -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SDLException) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SDLException) #

gmapT :: (forall b. Data b => b -> b) -> SDLException -> SDLException #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SDLException -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SDLException -> r #

gmapQ :: (forall d. Data d => d -> u) -> SDLException -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SDLException -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SDLException -> m SDLException #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SDLException -> m SDLException #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SDLException -> m SDLException #

Ord SDLException Source # 
Instance details
Read SDLException Source # 
Instance details
Show SDLException Source # 
Instance details
Generic SDLException Source # 
Instance details

Associated Types

type Rep SDLException :: * -> * #

Exception SDLException Source # 
Instance details
type Rep SDLException Source # 
Instance details