Safe Haskell | None |
---|---|
Language | Haskell2010 |
Documentation
initialize :: (Foldable f, Functor m, MonadIO m) => f InitFlag -> m () Source #
Initializes SDL and the given subsystems. Do not call any SDL functions prior to this one, unless otherwise documented that you may do so.
You may call this function again with additional subsystems to initialize.
Throws SDLException
if initialization fails.
initializeAll :: (Functor m, MonadIO m) => m () Source #
Equivalent to
.initialize
[minBound
.. maxBound
]
Instances
Bounded InitFlag Source # | |
Enum InitFlag Source # | |
Eq InitFlag Source # | |
Data InitFlag Source # | |
Defined in SDL.Init gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InitFlag -> c InitFlag # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InitFlag # toConstr :: InitFlag -> Constr # dataTypeOf :: InitFlag -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InitFlag) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InitFlag) # gmapT :: (forall b. Data b => b -> b) -> InitFlag -> InitFlag # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InitFlag -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InitFlag -> r # gmapQ :: (forall d. Data d => d -> u) -> InitFlag -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> InitFlag -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> InitFlag -> m InitFlag # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InitFlag -> m InitFlag # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InitFlag -> m InitFlag # | |
Ord InitFlag Source # | |
Read InitFlag Source # | |
Show InitFlag Source # | |
Generic InitFlag Source # | |
ToNumber InitFlag Word32 Source # | |
type Rep InitFlag Source # | |
Defined in SDL.Init type Rep InitFlag = D1 ('MetaData "InitFlag" "SDL.Init" "sdl2-2.5.3.3-HCjHTJOz3X6JRl8kWTEnNb" 'False) ((C1 ('MetaCons "InitTimer" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "InitAudio" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InitVideo" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "InitJoystick" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InitHaptic" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "InitGameController" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "InitEvents" 'PrefixI 'False) (U1 :: Type -> Type)))) |