{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.SGIX.AsyncHistogram (
gl_SGIX_async_histogram
, pattern GL_ASYNC_HISTOGRAM_SGIX
, pattern GL_MAX_ASYNC_HISTOGRAM_SGIX
) where
import Data.Set
import Graphics.GL.Internal.Proc
gl_SGIX_async_histogram :: Bool
gl_SGIX_async_histogram :: Bool
gl_SGIX_async_histogram = [Char] -> Set [Char] -> Bool
forall a. Ord a => a -> Set a -> Bool
member "GL_SGIX_async_histogram" Set [Char]
extensions
{-# NOINLINE gl_SGIX_async_histogram #-}
pattern $bGL_ASYNC_HISTOGRAM_SGIX :: a
$mGL_ASYNC_HISTOGRAM_SGIX :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_ASYNC_HISTOGRAM_SGIX = 0x832C
pattern $bGL_MAX_ASYNC_HISTOGRAM_SGIX :: a
$mGL_MAX_ASYNC_HISTOGRAM_SGIX :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_MAX_ASYNC_HISTOGRAM_SGIX = 0x832D