Safe Haskell | None |
---|---|
Language | Haskell2010 |
Miscellaneous wrapped calls to GLFW-b for application programmer use.
Actions are in the GPipe ContextT
monad when a window handle is required,
otherwise they are bare reexported IO actions which can be lifted into the ContextT
monad.
The Window
taken by many of these functions is the window resource from GPipe.
Error handling
To set a custom error callback use HandleConfig
in Graphics.GPipe.Context.GLFW.
An enum for one of the GLFW error codes.
Error'NotInitialized | |
Error'NoCurrentContext | |
Error'InvalidEnum | |
Error'InvalidValue | |
Error'OutOfMemory | |
Error'ApiUnavailable | |
Error'VersionUnavailable | |
Error'PlatformError | |
Error'FormatUnavailable |
Instances
Bounded Error | |
Enum Error | |
Defined in Graphics.UI.GLFW.Types | |
Eq Error | |
Data Error | |
Defined in Graphics.UI.GLFW.Types gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Error -> c Error # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Error # dataTypeOf :: Error -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Error) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Error) # gmapT :: (forall b. Data b => b -> b) -> Error -> Error # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Error -> r # gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Error -> r # gmapQ :: (forall d. Data d => d -> u) -> Error -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Error -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Error -> m Error # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Error -> m Error # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Error -> m Error # | |
Ord Error | |
Read Error | |
Show Error | |
Generic Error | |
NFData Error | |
Defined in Graphics.UI.GLFW.Types | |
type Rep Error | |
Defined in Graphics.UI.GLFW.Types type Rep Error = D1 ('MetaData "Error" "Graphics.UI.GLFW.Types" "GLFW-b-3.3.0.0-b60f4775f95ed8d05a52621ce1d256db543f2966" 'False) (((C1 ('MetaCons "Error'NotInitialized" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'NoCurrentContext" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Error'InvalidEnum" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'InvalidValue" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "Error'OutOfMemory" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'ApiUnavailable" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "Error'VersionUnavailable" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Error'PlatformError" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Error'FormatUnavailable" 'PrefixI 'False) (U1 :: Type -> Type))))) |