gl-0.8.0: Complete OpenGL raw bindings

Safe HaskellNone
LanguageHaskell2010

Graphics.GL.Ext.ARB.VertexShader

Contents

Synopsis

Extension Support

gl_ARB_vertex_shader :: Bool Source #

Checks that the GL_ARB_vertex_shader extension is available.

GL_ARB_vertex_shader

glBindAttribLocationARB :: MonadIO m => GLhandleARB -> GLuint -> Ptr GLcharARB -> m () Source #

Usage: glBindAttribLocationARB programObj index name

The parameter programObj is a handleARB.

This command is an alias for glBindAttribLocation.

glGetActiveAttribARB :: MonadIO m => GLhandleARB -> GLuint -> GLsizei -> Ptr GLsizei -> Ptr GLint -> Ptr GLenum -> Ptr GLcharARB -> m () Source #

Usage: glGetActiveAttribARB programObj index maxLength length size type name

The parameter programObj is a handleARB.

The length of length should be 1.

The length of size should be 1.

The length of type should be 1.

The length of name should be maxLength.

This command is an alias for glGetActiveAttrib.

glGetAttribLocationARB :: MonadIO m => GLhandleARB -> Ptr GLcharARB -> m GLint Source #

Usage: glGetAttribLocationARB programObj name

The parameter programObj is a handleARB.

This command is an alias for glGetAttribLocation.

glGetVertexAttribPointervARB :: MonadIO m => GLuint -> GLenum -> Ptr (Ptr ()) -> m () Source #

Usage: glGetVertexAttribPointervARB index pname pointer

The parameter pname is a VertexAttribPointerPropertyARB.

The length of pointer should be 1.

This command is an alias for glGetVertexAttribPointerv.

glGetVertexAttribdvARB :: MonadIO m => GLuint -> GLenum -> Ptr GLdouble -> m () Source #

Usage: glGetVertexAttribdvARB index pname params

The parameter pname is a VertexAttribPropertyARB.

The length of params should be 4.

This command is an alias for glGetVertexAttribdv.

glGetVertexAttribfvARB :: MonadIO m => GLuint -> GLenum -> Ptr GLfloat -> m () Source #

Usage: glGetVertexAttribfvARB index pname params

The parameter pname is a VertexAttribPropertyARB.

The length of params should be 4.

This command is an alias for glGetVertexAttribfv.

glGetVertexAttribivARB :: MonadIO m => GLuint -> GLenum -> Ptr GLint -> m () Source #

Usage: glGetVertexAttribivARB index pname params

The parameter pname is a VertexAttribPropertyARB.

The length of params should be 4.

This command is an alias for glGetVertexAttribiv.

glVertexAttrib1dARB :: MonadIO m => GLuint -> GLdouble -> m () Source #

Usage: glVertexAttrib1dARB index x

This command is an alias for glVertexAttrib1d.

The vector equivalent of this command is glVertexAttrib1dvARB.

glVertexAttrib1dvARB :: MonadIO m => GLuint -> Ptr GLdouble -> m () Source #

Usage: glVertexAttrib1dvARB index v

The length of v should be 1.

This command is an alias for glVertexAttrib1dv.

glVertexAttrib1fARB :: MonadIO m => GLuint -> GLfloat -> m () Source #

Usage: glVertexAttrib1fARB index x

This command is an alias for glVertexAttrib1f.

The vector equivalent of this command is glVertexAttrib1fvARB.

glVertexAttrib1fvARB :: MonadIO m => GLuint -> Ptr GLfloat -> m () Source #

Usage: glVertexAttrib1fvARB index v

The length of v should be 1.

This command is an alias for glVertexAttrib1fv.

glVertexAttrib1sARB :: MonadIO m => GLuint -> GLshort -> m () Source #

Usage: glVertexAttrib1sARB index x

This command is an alias for glVertexAttrib1s.

The vector equivalent of this command is glVertexAttrib1svARB.

glVertexAttrib1svARB :: MonadIO m => GLuint -> Ptr GLshort -> m () Source #

Usage: glVertexAttrib1svARB index v

The length of v should be 1.

This command is an alias for glVertexAttrib1sv.

glVertexAttrib2dARB :: MonadIO m => GLuint -> GLdouble -> GLdouble -> m () Source #

Usage: glVertexAttrib2dARB index x y

This command is an alias for glVertexAttrib2d.

The vector equivalent of this command is glVertexAttrib2dvARB.

glVertexAttrib2dvARB :: MonadIO m => GLuint -> Ptr GLdouble -> m () Source #

Usage: glVertexAttrib2dvARB index v

The length of v should be 2.

This command is an alias for glVertexAttrib2dv.

glVertexAttrib2fARB :: MonadIO m => GLuint -> GLfloat -> GLfloat -> m () Source #

Usage: glVertexAttrib2fARB index x y

This command is an alias for glVertexAttrib2f.

The vector equivalent of this command is glVertexAttrib2fvARB.

glVertexAttrib2fvARB :: MonadIO m => GLuint -> Ptr GLfloat -> m () Source #

Usage: glVertexAttrib2fvARB index v

The length of v should be 2.

This command is an alias for glVertexAttrib2fv.

glVertexAttrib2sARB :: MonadIO m => GLuint -> GLshort -> GLshort -> m () Source #

Usage: glVertexAttrib2sARB index x y

This command is an alias for glVertexAttrib2s.

The vector equivalent of this command is glVertexAttrib2svARB.

glVertexAttrib2svARB :: MonadIO m => GLuint -> Ptr GLshort -> m () Source #

Usage: glVertexAttrib2svARB index v

The length of v should be 2.

This command is an alias for glVertexAttrib2sv.

glVertexAttrib3dARB :: MonadIO m => GLuint -> GLdouble -> GLdouble -> GLdouble -> m () Source #

Usage: glVertexAttrib3dARB index x y z

This command is an alias for glVertexAttrib3d.

The vector equivalent of this command is glVertexAttrib3dvARB.

glVertexAttrib3dvARB :: MonadIO m => GLuint -> Ptr GLdouble -> m () Source #

Usage: glVertexAttrib3dvARB index v

The length of v should be 3.

This command is an alias for glVertexAttrib3dv.

glVertexAttrib3fARB :: MonadIO m => GLuint -> GLfloat -> GLfloat -> GLfloat -> m () Source #

Usage: glVertexAttrib3fARB index x y z

This command is an alias for glVertexAttrib3f.

The vector equivalent of this command is glVertexAttrib3fvARB.

glVertexAttrib3fvARB :: MonadIO m => GLuint -> Ptr GLfloat -> m () Source #

Usage: glVertexAttrib3fvARB index v

The length of v should be 3.

This command is an alias for glVertexAttrib3fv.

glVertexAttrib3sARB :: MonadIO m => GLuint -> GLshort -> GLshort -> GLshort -> m () Source #

Usage: glVertexAttrib3sARB index x y z

This command is an alias for glVertexAttrib3s.

The vector equivalent of this command is glVertexAttrib3svARB.

glVertexAttrib3svARB :: MonadIO m => GLuint -> Ptr GLshort -> m () Source #

Usage: glVertexAttrib3svARB index v

The length of v should be 3.

This command is an alias for glVertexAttrib3sv.

glVertexAttrib4NbvARB :: MonadIO m => GLuint -> Ptr GLbyte -> m () Source #

Usage: glVertexAttrib4NbvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4Nbv.

glVertexAttrib4NivARB :: MonadIO m => GLuint -> Ptr GLint -> m () Source #

Usage: glVertexAttrib4NivARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4Niv.

glVertexAttrib4NsvARB :: MonadIO m => GLuint -> Ptr GLshort -> m () Source #

Usage: glVertexAttrib4NsvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4Nsv.

glVertexAttrib4NubARB :: MonadIO m => GLuint -> GLubyte -> GLubyte -> GLubyte -> GLubyte -> m () Source #

Usage: glVertexAttrib4NubARB index x y z w

This command is an alias for glVertexAttrib4Nub.

glVertexAttrib4NubvARB :: MonadIO m => GLuint -> Ptr GLubyte -> m () Source #

Usage: glVertexAttrib4NubvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4Nubv.

glVertexAttrib4NuivARB :: MonadIO m => GLuint -> Ptr GLuint -> m () Source #

Usage: glVertexAttrib4NuivARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4Nuiv.

glVertexAttrib4NusvARB :: MonadIO m => GLuint -> Ptr GLushort -> m () Source #

Usage: glVertexAttrib4NusvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4Nusv.

glVertexAttrib4bvARB :: MonadIO m => GLuint -> Ptr GLbyte -> m () Source #

Usage: glVertexAttrib4bvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4bv.

glVertexAttrib4dARB :: MonadIO m => GLuint -> GLdouble -> GLdouble -> GLdouble -> GLdouble -> m () Source #

Usage: glVertexAttrib4dARB index x y z w

This command is an alias for glVertexAttrib4d.

The vector equivalent of this command is glVertexAttrib4dvARB.

glVertexAttrib4dvARB :: MonadIO m => GLuint -> Ptr GLdouble -> m () Source #

Usage: glVertexAttrib4dvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4dv.

glVertexAttrib4fARB :: MonadIO m => GLuint -> GLfloat -> GLfloat -> GLfloat -> GLfloat -> m () Source #

Usage: glVertexAttrib4fARB index x y z w

This command is an alias for glVertexAttrib4f.

The vector equivalent of this command is glVertexAttrib4fvARB.

glVertexAttrib4fvARB :: MonadIO m => GLuint -> Ptr GLfloat -> m () Source #

Usage: glVertexAttrib4fvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4fv.

glVertexAttrib4ivARB :: MonadIO m => GLuint -> Ptr GLint -> m () Source #

Usage: glVertexAttrib4ivARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4iv.

glVertexAttrib4sARB :: MonadIO m => GLuint -> GLshort -> GLshort -> GLshort -> GLshort -> m () Source #

Usage: glVertexAttrib4sARB index x y z w

This command is an alias for glVertexAttrib4s.

The vector equivalent of this command is glVertexAttrib4svARB.

glVertexAttrib4svARB :: MonadIO m => GLuint -> Ptr GLshort -> m () Source #

Usage: glVertexAttrib4svARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4sv.

glVertexAttrib4ubvARB :: MonadIO m => GLuint -> Ptr GLubyte -> m () Source #

Usage: glVertexAttrib4ubvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4ubv.

glVertexAttrib4uivARB :: MonadIO m => GLuint -> Ptr GLuint -> m () Source #

Usage: glVertexAttrib4uivARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4uiv.

glVertexAttrib4usvARB :: MonadIO m => GLuint -> Ptr GLushort -> m () Source #

Usage: glVertexAttrib4usvARB index v

The length of v should be 4.

This command is an alias for glVertexAttrib4usv.

glVertexAttribPointerARB :: MonadIO m => GLuint -> GLint -> GLenum -> GLboolean -> GLsizei -> Ptr () -> m () Source #

Usage: glVertexAttribPointerARB index size type normalized stride pointer

The parameter type is a VertexAttribPointerType.

The parameter normalized is a Boolean, one of: GL_FALSE, GL_TRUE.

The length of pointer should be COMPSIZE(size,type,stride).

This command is an alias for glVertexAttribPointer.

pattern GL_CURRENT_VERTEX_ATTRIB_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT_MAT2_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT_MAT3_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT_MAT4_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT_VEC2_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT_VEC3_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_FLOAT_VEC4_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_COMBINED_TEXTURE_IMAGE_UNITS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_TEXTURE_COORDS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_TEXTURE_IMAGE_UNITS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_VARYING_FLOATS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_VERTEX_ATTRIBS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_VERTEX_TEXTURE_IMAGE_UNITS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_MAX_VERTEX_UNIFORM_COMPONENTS_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_OBJECT_ACTIVE_ATTRIBUTES_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_OBJECT_ACTIVE_ATTRIBUTE_MAX_LENGTH_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_ATTRIB_ARRAY_ENABLED_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_ATTRIB_ARRAY_NORMALIZED_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_ATTRIB_ARRAY_POINTER_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_ATTRIB_ARRAY_SIZE_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_ATTRIB_ARRAY_STRIDE_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_ATTRIB_ARRAY_TYPE_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_PROGRAM_POINT_SIZE_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_PROGRAM_TWO_SIDE_ARB :: forall a. (Num a, Eq a) => a Source #

pattern GL_VERTEX_SHADER_ARB :: forall a. (Num a, Eq a) => a Source #