{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.ARB.ShaderSubroutine (
gl_ARB_shader_subroutine
, glGetActiveSubroutineName
, glGetActiveSubroutineUniformName
, glGetActiveSubroutineUniformiv
, glGetProgramStageiv
, glGetSubroutineIndex
, glGetSubroutineUniformLocation
, glGetUniformSubroutineuiv
, glUniformSubroutinesuiv
, pattern GL_ACTIVE_SUBROUTINES
, pattern GL_ACTIVE_SUBROUTINE_MAX_LENGTH
, pattern GL_ACTIVE_SUBROUTINE_UNIFORMS
, pattern GL_ACTIVE_SUBROUTINE_UNIFORM_LOCATIONS
, pattern GL_ACTIVE_SUBROUTINE_UNIFORM_MAX_LENGTH
, pattern GL_COMPATIBLE_SUBROUTINES
, pattern GL_MAX_SUBROUTINES
, pattern GL_MAX_SUBROUTINE_UNIFORM_LOCATIONS
, pattern GL_NUM_COMPATIBLE_SUBROUTINES
, pattern GL_UNIFORM_NAME_LENGTH
, pattern GL_UNIFORM_SIZE
) where
import Data.Set
import Graphics.GL.Internal.Proc
import Graphics.GL.Internal.Shared
gl_ARB_shader_subroutine :: Bool
gl_ARB_shader_subroutine :: Bool
gl_ARB_shader_subroutine = [Char] -> Set [Char] -> Bool
forall a. Ord a => a -> Set a -> Bool
member "GL_ARB_shader_subroutine" Set [Char]
extensions
{-# NOINLINE gl_ARB_shader_subroutine #-}