-- This file was automatically generated.
{-# LANGUAGE ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Raw.Extension.EXT.BlendColor (
  -- * Extension Support
    gl_EXT_blend_color

  -- * GL_EXT_blend_color
  , glBlendColorEXT
  , pattern GL_BLEND_COLOR_EXT
  , pattern GL_CONSTANT_ALPHA_EXT
  , pattern GL_CONSTANT_COLOR_EXT
  , pattern GL_ONE_MINUS_CONSTANT_ALPHA_EXT
  , pattern GL_ONE_MINUS_CONSTANT_COLOR_EXT
) where

import Control.Monad.IO.Class
import Data.Set
import Foreign.Ptr
import Graphics.GL.Raw.Internal.FFI
import Graphics.GL.Raw.Internal.Proc
import Graphics.GL.Raw.Types
import System.IO.Unsafe

gl_EXT_blend_color :: Bool
gl_EXT_blend_color = member "GL_EXT_blend_color" extensions

glBlendColorEXT :: MonadIO m => GLfloat -> GLfloat -> GLfloat -> GLfloat -> m ()
glBlendColorEXT = ffifloatfloatfloatfloatIOV glBlendColorEXTFunPtr

glBlendColorEXTFunPtr :: FunPtr (GLfloat -> GLfloat -> GLfloat -> GLfloat -> IO ())
glBlendColorEXTFunPtr = unsafePerformIO (getProcAddress "glBlendColorEXT")

{-# NOINLINE glBlendColorEXTFunPtr #-}

pattern GL_BLEND_COLOR_EXT = 0x8005

pattern GL_CONSTANT_ALPHA_EXT = 0x8003

pattern GL_CONSTANT_COLOR_EXT = 0x8001

pattern GL_ONE_MINUS_CONSTANT_ALPHA_EXT = 0x8004

pattern GL_ONE_MINUS_CONSTANT_COLOR_EXT = 0x8002