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

  -- * GL_ANGLE_framebuffer_blit
  , glBlitFramebufferANGLE
  , pattern GL_DRAW_FRAMEBUFFER_ANGLE
  , pattern GL_DRAW_FRAMEBUFFER_BINDING_ANGLE
  , pattern GL_READ_FRAMEBUFFER_ANGLE
  , pattern GL_READ_FRAMEBUFFER_BINDING_ANGLE
) 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://www.khronos.org/registry/gles/extensions/ANGLE/ANGLE_framebuffer_blit.txt GL_ANGLE_framebuffer_blit> extension is available.

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

-- | Usage: @'glBlitFramebufferANGLE' srcX0 srcY0 srcX1 srcY1 dstX0 dstY0 dstX1 dstY1 mask filter@


glBlitFramebufferANGLE :: MonadIO m => GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLbitfield -> GLenum -> m ()
glBlitFramebufferANGLE :: GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLint
-> GLbitfield
-> GLbitfield
-> m ()
glBlitFramebufferANGLE = 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 ())
glBlitFramebufferANGLEFunPtr

glBlitFramebufferANGLEFunPtr :: FunPtr (GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLbitfield -> GLenum -> IO ())
glBlitFramebufferANGLEFunPtr :: FunPtr
  (GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLint
   -> GLbitfield
   -> GLbitfield
   -> IO ())
glBlitFramebufferANGLEFunPtr = 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 "glBlitFramebufferANGLE")

{-# NOINLINE glBlitFramebufferANGLEFunPtr #-}

pattern $bGL_DRAW_FRAMEBUFFER_ANGLE :: a
$mGL_DRAW_FRAMEBUFFER_ANGLE :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_DRAW_FRAMEBUFFER_ANGLE = 0x8CA9

pattern $bGL_DRAW_FRAMEBUFFER_BINDING_ANGLE :: a
$mGL_DRAW_FRAMEBUFFER_BINDING_ANGLE :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_DRAW_FRAMEBUFFER_BINDING_ANGLE = 0x8CA6

pattern $bGL_READ_FRAMEBUFFER_ANGLE :: a
$mGL_READ_FRAMEBUFFER_ANGLE :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_READ_FRAMEBUFFER_ANGLE = 0x8CA8

pattern $bGL_READ_FRAMEBUFFER_BINDING_ANGLE :: a
$mGL_READ_FRAMEBUFFER_BINDING_ANGLE :: forall r a. (Eq a, Num a) => a -> (Void# -> r) -> (Void# -> r) -> r
GL_READ_FRAMEBUFFER_BINDING_ANGLE = 0x8CAA