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

Engine.Setup.Window

Documentation

data Window #

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 #

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

toConstr :: Window -> Constr #

dataTypeOf :: Window -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Associated Types

type Rep Window :: Type -> Type #

Methods

from :: Window -> Rep Window x #

to :: Rep Window x -> Window #

Show Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Eq Window 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

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

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

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-7f7f9fc75c14f672eb4b66ff738bd73279d4b8e9403ce112e015cfc3c20e5cac" 'True) (C1 ('MetaCons "Window" 'PrefixI 'True) (S1 ('MetaSel ('Just "unWindow") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Ptr C'GLFWwindow))))

allocate :: (MonadUnliftIO m, MonadReader env m, HasLogFunc env, MonadResource m) => Bool -> Natural -> SizePicker -> Text -> m ([InstanceRequirement], Window) Source #

createWindow :: (MonadIO m, MonadReader env m, HasLogFunc env) => Bool -> Natural -> SizePicker -> Text -> m ([InstanceRequirement], Window) Source #

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

type SizePicker = NonEmpty (Monitor, VideoMode) -> (Monitor, VideoMode) Source #

data SurfaceKHR #

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

Methods

objectTypeAndHandle :: SurfaceKHR -> (ObjectType, Word64)

IsHandle SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

Zero SurfaceKHR 
Instance details

Defined in Vulkan.Extensions.Handles

Methods

zero :: SurfaceKHR

allocateSurface :: MonadResource m => Window -> Instance -> m (ReleaseKey, SurfaceKHR) Source #

createSurface :: MonadIO m => Window -> Instance -> m SurfaceKHR Source #

getExtent2D :: Window -> IO Extent2D Source #

data Error #

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 #

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

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 #

Methods

from :: Error -> Rep Error x #

to :: Rep Error x -> Error #

Read Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Show Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

showsPrec :: Int -> Error -> ShowS #

show :: Error -> String #

showList :: [Error] -> ShowS #

NFData Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

rnf :: Error -> () #

Eq Error 
Instance details

Defined in Graphics.UI.GLFW.Types

Methods

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

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

Ord Error 
Instance details

Defined in Graphics.UI.GLFW.Types

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 #

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-7f7f9fc75c14f672eb4b66ff738bd73279d4b8e9403ce112e015cfc3c20e5cac" '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)))))