luminance-0.11.0.4: Type-safe, type-level and stateless graphics framework

Copyright(C) 2015, 2016 Dimitri Sabadie
LicenseBSD3
MaintainerDimitri Sabadie <dimitri.sabadie@gmail.com>
Stabilityexperimental
Portabilityportable
Safe HaskellSafe
LanguageHaskell2010

Graphics.Luminance.Core.Tuple

Description

 

Synopsis

Documentation

data a :. b infixr 6 Source #

A tuple of types, right-associated.

The Storable instance is used for foreign packing on 32-bit.

Constructors

a :. b infixr 6 

Instances

Functor ((:.) a) Source # 

Methods

fmap :: (a -> b) -> (a :. a) -> a :. b #

(<$) :: a -> (a :. b) -> a :. a #

(Eq a, Eq b) => Eq ((:.) a b) Source # 

Methods

(==) :: (a :. b) -> (a :. b) -> Bool #

(/=) :: (a :. b) -> (a :. b) -> Bool #

(Ord a, Ord b) => Ord ((:.) a b) Source # 

Methods

compare :: (a :. b) -> (a :. b) -> Ordering #

(<) :: (a :. b) -> (a :. b) -> Bool #

(<=) :: (a :. b) -> (a :. b) -> Bool #

(>) :: (a :. b) -> (a :. b) -> Bool #

(>=) :: (a :. b) -> (a :. b) -> Bool #

max :: (a :. b) -> (a :. b) -> a :. b #

min :: (a :. b) -> (a :. b) -> a :. b #

(Show a, Show b) => Show ((:.) a b) Source # 

Methods

showsPrec :: Int -> (a :. b) -> ShowS #

show :: (a :. b) -> String #

showList :: [a :. b] -> ShowS #

Generic ((:.) a b) Source # 

Associated Types

type Rep ((:.) a b) :: * -> * #

Methods

from :: (a :. b) -> Rep (a :. b) x #

to :: Rep (a :. b) x -> a :. b #

(Storable a, Storable b) => Storable ((:.) a b) Source # 

Methods

sizeOf :: (a :. b) -> Int #

alignment :: (a :. b) -> Int #

peekElemOff :: Ptr (a :. b) -> Int -> IO (a :. b) #

pokeElemOff :: Ptr (a :. b) -> Int -> (a :. b) -> IO () #

peekByteOff :: Ptr b -> Int -> IO (a :. b) #

pokeByteOff :: Ptr b -> Int -> (a :. b) -> IO () #

peek :: Ptr (a :. b) -> IO (a :. b) #

poke :: Ptr (a :. b) -> (a :. b) -> IO () #

(ColorPixel a, ColorPixel b, FramebufferColorAttachment a, FramebufferColorAttachment b) => FramebufferColorAttachment ((:.) a b) Source # 

Methods

addColorOutput :: MonadResource m => GLuint -> Natural -> Natural -> Natural -> Natural -> proxy (a :. b) -> m (Natural, TexturizeFormat (a :. b))

(UniformBlock a, UniformBlock b) => UniformBlock ((:.) a b) Source # 

Methods

isStruct :: proxy (a :. b) -> Bool

alignmentSTD140 :: proxy (a :. b) -> Int

sizeOfSTD140 :: proxy (a :. b) -> Int

peekSTD140 :: MonadIO m => Ptr b -> Int -> m (a :. b)

pokeSTD140 :: MonadIO m => Ptr b -> Int -> (a :. b) -> m ()

(Vertex a, Vertex b) => Vertex ((:.) a b) Source # 

Methods

setFormatV :: MonadIO m => GLuint -> GLuint -> GLuint -> proxy (a :. b) -> m (GLuint, GLuint)

type Rep ((:.) a b) Source # 
type Rep ((:.) a b) = D1 (MetaData ":." "Graphics.Luminance.Core.Tuple" "luminance-0.11.0.4-IOWyMjVwJIQHLSXSQbB3Bq" False) (C1 (MetaCons ":." (InfixI RightAssociative 6) False) ((:*:) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 a)) (S1 (MetaSel (Nothing Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 b))))