{-# LANGUAGE PatternSynonyms, ScopedTypeVariables, ViewPatterns #-}


-- | Copyright  : Will Thompson and Iñaki García Etxebarria
-- License    : LGPL-2.1
-- Maintainer : Iñaki García Etxebarria

#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif

module GI.Cogl.Constants
    ( 
    pattern TEXTURE_MAX_WASTE               ,
    pattern STENCIL_BIT                     ,
    pattern SQRTI_ARG_MAX                   ,
    pattern SQRTI_ARG_5_PERCENT             ,
    pattern SQRTI_ARG_10_PERCENT            ,
    pattern RADIANS_TO_DEGREES              ,
    pattern PREMULT_BIT                     ,
    pattern FIXED_Q                         ,
    pattern FIXED_PI_4                      ,
    pattern FIXED_PI_2                      ,
    pattern FIXED_PI                        ,
    pattern FIXED_MIN                       ,
    pattern FIXED_MAX                       ,
    pattern FIXED_EPSILON                   ,
    pattern FIXED_BITS                      ,
    pattern FIXED_2_PI                      ,
    pattern FIXED_1                         ,
    pattern FIXED_0_5                       ,
    pattern DEPTH_BIT                       ,
    pattern BGR_BIT                         ,
    pattern A_BIT                           ,
    pattern AFIRST_BIT                      ,

    ) where

import Data.GI.Base.ShortPrelude
import qualified Data.GI.Base.ShortPrelude as SP
import qualified Data.GI.Base.Overloading as O
import qualified Prelude as P

import qualified Data.GI.Base.Attributes as GI.Attributes
import qualified Data.GI.Base.BasicTypes as B.Types
import qualified Data.GI.Base.ManagedPtr as B.ManagedPtr
import qualified Data.GI.Base.GArray as B.GArray
import qualified Data.GI.Base.GClosure as B.GClosure
import qualified Data.GI.Base.GError as B.GError
import qualified Data.GI.Base.GHashTable as B.GHT
import qualified Data.GI.Base.GVariant as B.GVariant
import qualified Data.GI.Base.GValue as B.GValue
import qualified Data.GI.Base.GParamSpec as B.GParamSpec
import qualified Data.GI.Base.CallStack as B.CallStack
import qualified Data.GI.Base.Properties as B.Properties
import qualified Data.GI.Base.Signals as B.Signals
import qualified Control.Monad.IO.Class as MIO
import qualified Data.Coerce as Coerce
import qualified Data.Text as T
import qualified Data.Kind as DK
import qualified Data.ByteString.Char8 as B
import qualified Data.Map as Map
import qualified Foreign.Ptr as FP
import qualified GHC.OverloadedLabels as OL
import qualified GHC.Records as R


-- | /No description available in the introspection data./
pattern $mTEXTURE_MAX_WASTE :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bTEXTURE_MAX_WASTE :: Int32
TEXTURE_MAX_WASTE = 127 :: Int32

-- | /No description available in the introspection data./
pattern $mSTENCIL_BIT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bSTENCIL_BIT :: Int32
STENCIL_BIT = 512 :: Int32

-- | Maximum argument that can be passed to 'GI.Cogl.Functions.sqrti' function.
-- 
-- /Since: 1.0/
pattern $mSQRTI_ARG_MAX :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bSQRTI_ARG_MAX :: Int32
SQRTI_ARG_MAX = 4194303 :: Int32

-- | Maximum argument that can be passed to 'GI.Cogl.Functions.sqrti' for which the
-- resulting error is \< 5%
-- 
-- /Since: 1.0/
pattern $mSQRTI_ARG_5_PERCENT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bSQRTI_ARG_5_PERCENT :: Int32
SQRTI_ARG_5_PERCENT = 210 :: Int32

-- | Maximum argument that can be passed to 'GI.Cogl.Functions.sqrti' for which the
-- resulting error is \< 10%
-- 
-- /Since: 1.0/
pattern $mSQRTI_ARG_10_PERCENT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bSQRTI_ARG_10_PERCENT :: Int32
SQRTI_ARG_10_PERCENT = 5590 :: Int32

-- | Evaluates to 180 \/ pi in fixed point notation.
-- 
-- /Since: 1.0/
pattern $mRADIANS_TO_DEGREES :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bRADIANS_TO_DEGREES :: Int32
RADIANS_TO_DEGREES = 3754936 :: Int32

-- | /No description available in the introspection data./
pattern $mPREMULT_BIT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bPREMULT_BIT :: Int32
PREMULT_BIT = 128 :: Int32

-- | Evaluates to the number of bits used for the non-integer part
-- of the @/CoglFixed/@ type.
-- 
-- /Since: 1.0/
pattern $mFIXED_Q :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_Q :: Int32
FIXED_Q = -16 :: Int32

-- | pi \/ 4, expressed as @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_PI_4 :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_PI_4 :: Int32
FIXED_PI_4 = 51472 :: Int32

-- | Half pi, expressed as a @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_PI_2 :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_PI_2 :: Int32
FIXED_PI_2 = 102944 :: Int32

-- | The number pi, expressed as a @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_PI :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_PI :: Int32
FIXED_PI = 205887 :: Int32

-- | The smallest number representable using @/CoglFixed/@
-- 
-- /Since: 1.0/
pattern $mFIXED_MIN :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_MIN :: Int32
FIXED_MIN = 2147483648 :: Int32

-- | The biggest number representable using @/CoglFixed/@
-- 
-- /Since: 1.0/
pattern $mFIXED_MAX :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_MAX :: Int32
FIXED_MAX = 2147483647 :: Int32

-- | A very small number expressed as a @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_EPSILON :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_EPSILON :: Int32
FIXED_EPSILON = 1 :: Int32

-- | Evaluates to the number of bits used by the @/CoglFixed/@ type.
-- 
-- /Since: 1.0/
pattern $mFIXED_BITS :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_BITS :: Int32
FIXED_BITS = 32 :: Int32

-- | Two times pi, expressed as a @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_2_PI :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_2_PI :: Int32
FIXED_2_PI = 411775 :: Int32

-- | The number 1 expressed as a @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_1 :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_1 :: Int32
FIXED_1 = 1 :: Int32

-- | The number 0.5 expressed as a @/CoglFixed/@ number.
-- 
-- /Since: 1.0/
pattern $mFIXED_0_5 :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bFIXED_0_5 :: Int32
FIXED_0_5 = 32768 :: Int32

-- | /No description available in the introspection data./
pattern $mDEPTH_BIT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bDEPTH_BIT :: Int32
DEPTH_BIT = 256 :: Int32

-- | /No description available in the introspection data./
pattern $mBGR_BIT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bBGR_BIT :: Int32
BGR_BIT = 32 :: Int32

-- | /No description available in the introspection data./
pattern $mA_BIT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bA_BIT :: Int32
A_BIT = 16 :: Int32

-- | /No description available in the introspection data./
pattern $mAFIRST_BIT :: forall {r}. Int32 -> ((# #) -> r) -> ((# #) -> r) -> r
$bAFIRST_BIT :: Int32
AFIRST_BIT = 64 :: Int32