-- This file was automatically generated.
{-# LANGUAGE CPP, ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Ext.EXT.FramebufferBlit (
  -- * Extension Support
    gl_EXT_framebuffer_blit

  -- * GL_EXT_framebuffer_blit
  , glBlitFramebufferEXT
  , pattern GL_DRAW_FRAMEBUFFER_BINDING_EXT
  , pattern GL_DRAW_FRAMEBUFFER_EXT
  , pattern GL_READ_FRAMEBUFFER_BINDING_EXT
  , pattern GL_READ_FRAMEBUFFER_EXT
) where

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

-- | Checks that the <https://cvs.khronos.org/svn/repos/ogl/trunk/doc/registry/public/specs/EXT/framebuffer_blit.txt GL_EXT_framebuffer_blit> extension is available.

gl_EXT_framebuffer_blit :: Bool
gl_EXT_framebuffer_blit :: Bool
gl_EXT_framebuffer_blit = [Char] -> Set [Char] -> Bool
forall a. Ord a => a -> Set a -> Bool
member "GL_EXT_framebuffer_blit" Set [Char]
extensions
{-# NOINLINE gl_EXT_framebuffer_blit #-}

-- | Usage: @'glBlitFramebufferEXT' srcX0 srcY0 srcX1 srcY1 dstX0 dstY0 dstX1 dstY1 mask filter@
--
-- The parameter @mask@ is a @ClearBufferMask@, one of: 'Graphics.GL.Internal.Shared.GL_ACCUM_BUFFER_BIT', 'Graphics.GL.Internal.Shared.GL_COLOR_BUFFER_BIT', 'Graphics.GL.Ext.NV.CoverageSample.GL_COVERAGE_BUFFER_BIT_NV', 'Graphics.GL.Internal.Shared.GL_DEPTH_BUFFER_BIT', 'Graphics.GL.Internal.Shared.GL_STENCIL_BUFFER_BIT'.
--
-- This command is an alias for 'Graphics.GL.Internal.Shared.glBlitFramebuffer'.


glBlitFramebufferEXT :: MonadIO m => GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLbitfield -> GLenum -> m ()
glBlitFramebufferEXT :: GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLbitfield
-> GLbitfield
-> m ()
glBlitFramebufferEXT = FunPtr
  (GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLbitfield
   -> GLbitfield
   -> IO ())
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLbitfield
-> GLbitfield
-> m ()
forall (m :: * -> *).
MonadIO m =>
FunPtr
  (GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLbitfield
   -> GLbitfield
   -> IO ())
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLbitfield
-> GLbitfield
-> m ()
ffiintintintintintintintintbitfieldenumIOV FunPtr
  (GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLbitfield
   -> GLbitfield
   -> IO ())
glBlitFramebufferEXTFunPtr

glBlitFramebufferEXTFunPtr :: FunPtr (GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLbitfield -> GLenum -> IO ())
glBlitFramebufferEXTFunPtr :: FunPtr
  (GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLbitfield
   -> GLbitfield
   -> IO ())
glBlitFramebufferEXTFunPtr = IO
  (FunPtr
     (GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLbitfield
      -> GLbitfield
      -> IO ()))
-> FunPtr
     (GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLint
      -> GLbitfield
      -> GLbitfield
      -> IO ())
forall a. IO a -> a
unsafePerformIO ([Char]
-> IO
     (FunPtr
        (GLint
         -> GLint
         -> GLint
         -> GLint
         -> GLint
         -> GLint
         -> GLint
         -> GLint
         -> GLbitfield
         -> GLbitfield
         -> IO ()))
forall a. [Char] -> IO (FunPtr a)
getProcAddress "glBlitFramebufferEXT")

{-# NOINLINE glBlitFramebufferEXTFunPtr #-}

pattern $bGL_DRAW_FRAMEBUFFER_BINDING_EXT :: a
$mGL_DRAW_FRAMEBUFFER_BINDING_EXT :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_DRAW_FRAMEBUFFER_BINDING_EXT = 0x8CA6

pattern $bGL_DRAW_FRAMEBUFFER_EXT :: a
$mGL_DRAW_FRAMEBUFFER_EXT :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_DRAW_FRAMEBUFFER_EXT = 0x8CA9

pattern $bGL_READ_FRAMEBUFFER_BINDING_EXT :: a
$mGL_READ_FRAMEBUFFER_BINDING_EXT :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_READ_FRAMEBUFFER_BINDING_EXT = 0x8CAA

pattern $bGL_READ_FRAMEBUFFER_EXT :: a
$mGL_READ_FRAMEBUFFER_EXT :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_READ_FRAMEBUFFER_EXT = 0x8CA8