keid-core-0.1.8.0: Core parts of Keid engine.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Engine.Setup.Window

Synopsis

Documentation

data Window Source #

Reprisents a GLFW window value. See the Window Guide

Instances

Instances details
Data Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

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

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

toConstr :: Window -> Constr Source #

dataTypeOf :: Window -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Generic Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Associated Types

type Rep Window :: Type -> Type Source #

Show Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Eq Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Ord Window 
Instance details

Defined in Graphics.UI.GLFW.Types

type Rep Window 
Instance details

Defined in Graphics.UI.GLFW.Types

type Rep Window = D1 ('MetaData "Window" "Graphics.UI.GLFW.Types" "GLFW-b-3.3.0.0-3be570e09ffa2a2e6308e9805ce91330653eacb3112e153ff220a38e8742d734" 'True) (C1 ('MetaCons "Window" 'PrefixI 'True) (S1 ('MetaSel ('Just "unWindow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ptr C'GLFWwindow))))

destroyWindow :: (MonadIO m, MonadReader env m, HasLogFunc env) => Window -> m () Source #

data SurfaceKHR Source #

Instances

Instances details
Storable SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

Show SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

Eq SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

Ord SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

HasObjectType SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

IsHandle SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

Zero SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

data Error Source #

An enum for one of the GLFW error codes.

Instances

Instances details
Data Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

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

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

toConstr :: Error -> Constr Source #

dataTypeOf :: Error -> DataType Source #

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

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

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

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

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

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

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

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

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

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

Bounded Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Enum Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Generic Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Associated Types

type Rep Error :: Type -> Type Source #

Methods

from :: Error -> Rep Error x Source #

to :: Rep Error x -> Error Source #

Read Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Show Error 
Instance details

Defined in Graphics.UI.GLFW.Types

NFData Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

rnf :: Error -> () Source #

Eq Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

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

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

Ord Error 
Instance details

Defined in Graphics.UI.GLFW.Types

type Rep Error 
Instance details

Defined in Graphics.UI.GLFW.Types

type Rep Error = D1 ('MetaData "Error" "Graphics.UI.GLFW.Types" "GLFW-b-3.3.0.0-3be570e09ffa2a2e6308e9805ce91330653eacb3112e153ff220a38e8742d734" '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)))))