GPipe-GLFW-1.4.1: GLFW OpenGL context creation for GPipe

Safe HaskellNone
LanguageHaskell2010

Graphics.GPipe.Context.GLFW.Misc

Contents

Description

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.

Synopsis

Error handling

To set a custom error callback use HandleConfig in Graphics.GPipe.Context.GLFW.

data Error :: * #

Instances

Enum Error 
Eq Error 

Methods

(==) :: Error -> Error -> Bool #

(/=) :: Error -> Error -> Bool #

Data Error 

Methods

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 #

toConstr :: Error -> Constr #

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 :: (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 

Methods

compare :: Error -> Error -> Ordering #

(<) :: Error -> Error -> Bool #

(<=) :: Error -> Error -> Bool #

(>) :: Error -> Error -> Bool #

(>=) :: Error -> Error -> Bool #

max :: Error -> Error -> Error #

min :: Error -> Error -> Error #

Read Error 
Show Error 

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

Generic Error 

Associated Types

type Rep Error :: * -> * #

Methods

from :: Error -> Rep Error x #

to :: Rep Error x -> Error #

type Rep Error 
type Rep Error = D1 (MetaData "Error" "Graphics.UI.GLFW.Types" "GLFW-b-1.4.8.1-Al6jnUrPA9PAgpgZuphRiw" False) ((:+:) ((:+:) ((:+:) (C1 (MetaCons "Error'NotInitialized" PrefixI False) U1) (C1 (MetaCons "Error'NoCurrentContext" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Error'InvalidEnum" PrefixI False) U1) (C1 (MetaCons "Error'InvalidValue" PrefixI False) U1))) ((:+:) ((:+:) (C1 (MetaCons "Error'OutOfMemory" PrefixI False) U1) (C1 (MetaCons "Error'ApiUnavailable" PrefixI False) U1)) ((:+:) (C1 (MetaCons "Error'VersionUnavailable" PrefixI False) U1) ((:+:) (C1 (MetaCons "Error'PlatformError" PrefixI False) U1) (C1 (MetaCons "Error'FormatUnavailable" PrefixI False) U1)))))