-- This file was automatically generated.
{-# LANGUAGE ScopedTypeVariables, PatternSynonyms #-}
module Graphics.GL.Raw.Extension.NV.FramebufferBlit (
  -- * Extension Support
    gl_NV_framebuffer_blit

  -- * GL_NV_framebuffer_blit
  , glBlitFramebufferNV
  , pattern GL_DRAW_FRAMEBUFFER_BINDING_NV
  , pattern GL_DRAW_FRAMEBUFFER_NV
  , pattern GL_READ_FRAMEBUFFER_BINDING_NV
  , pattern GL_READ_FRAMEBUFFER_NV
) 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

-- | Checks that the GL_NV_framebuffer_blit extension is available.

gl_NV_framebuffer_blit :: Bool
gl_NV_framebuffer_blit = member "GL_NV_framebuffer_blit" extensions
{-# NOINLINE gl_NV_framebuffer_blit #-}

-- | Usage: @'glBlitFramebufferNV' srcX0 srcY0 srcX1 srcY1 dstX0 dstY0 dstX1 dstY1 mask filter@
--
-- This command is an alias for 'Graphics.GL.Raw.Internal.Shared.glBlitFramebuffer'.


glBlitFramebufferNV :: MonadIO m => GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLbitfield -> GLenum -> m ()
glBlitFramebufferNV = ffiintintintintintintintintbitfieldenumIOV glBlitFramebufferNVFunPtr

glBlitFramebufferNVFunPtr :: FunPtr (GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLint -> GLbitfield -> GLenum -> IO ())
glBlitFramebufferNVFunPtr = unsafePerformIO (getProcAddress "glBlitFramebufferNV")

{-# NOINLINE glBlitFramebufferNVFunPtr #-}

pattern GL_DRAW_FRAMEBUFFER_BINDING_NV = 0x8CA6

pattern GL_DRAW_FRAMEBUFFER_NV = 0x8CA9

pattern GL_READ_FRAMEBUFFER_BINDING_NV = 0x8CAA

pattern GL_READ_FRAMEBUFFER_NV = 0x8CA8