{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.HarfBuzz.Structs.DrawStateT
    ( 
    DrawStateT(..)                          ,
    newZeroDrawStateT                       ,
 
#if defined(ENABLE_OVERLOADING)
    ResolveDrawStateTMethod                 ,
#endif
 
#if defined(ENABLE_OVERLOADING)
    drawStateT_currentX                     ,
#endif
    getDrawStateTCurrentX                   ,
    setDrawStateTCurrentX                   ,
#if defined(ENABLE_OVERLOADING)
    drawStateT_currentY                     ,
#endif
    getDrawStateTCurrentY                   ,
    setDrawStateTCurrentY                   ,
#if defined(ENABLE_OVERLOADING)
    drawStateT_pathOpen                     ,
#endif
    getDrawStateTPathOpen                   ,
    setDrawStateTPathOpen                   ,
#if defined(ENABLE_OVERLOADING)
    drawStateT_pathStartX                   ,
#endif
    getDrawStateTPathStartX                 ,
    setDrawStateTPathStartX                 ,
#if defined(ENABLE_OVERLOADING)
    drawStateT_pathStartY                   ,
#endif
    getDrawStateTPathStartY                 ,
    setDrawStateTPathStartY                 ,
    ) 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.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.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
newtype DrawStateT = DrawStateT (SP.ManagedPtr DrawStateT)
    deriving (DrawStateT -> DrawStateT -> Bool
(DrawStateT -> DrawStateT -> Bool)
-> (DrawStateT -> DrawStateT -> Bool) -> Eq DrawStateT
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: DrawStateT -> DrawStateT -> Bool
$c/= :: DrawStateT -> DrawStateT -> Bool
== :: DrawStateT -> DrawStateT -> Bool
$c== :: DrawStateT -> DrawStateT -> Bool
Eq)
instance SP.ManagedPtrNewtype DrawStateT where
    toManagedPtr :: DrawStateT -> ManagedPtr DrawStateT
toManagedPtr (DrawStateT ManagedPtr DrawStateT
p) = ManagedPtr DrawStateT
p
instance BoxedPtr DrawStateT where
    boxedPtrCopy :: DrawStateT -> IO DrawStateT
boxedPtrCopy = \DrawStateT
p -> DrawStateT -> (Ptr DrawStateT -> IO DrawStateT) -> IO DrawStateT
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr DrawStateT
p (Int -> Ptr DrawStateT -> IO (Ptr DrawStateT)
forall a. (HasCallStack, CallocPtr a) => Int -> Ptr a -> IO (Ptr a)
copyBytes Int
48 (Ptr DrawStateT -> IO (Ptr DrawStateT))
-> (Ptr DrawStateT -> IO DrawStateT)
-> Ptr DrawStateT
-> IO DrawStateT
forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
>=> (ManagedPtr DrawStateT -> DrawStateT)
-> Ptr DrawStateT -> IO DrawStateT
forall a.
(HasCallStack, BoxedPtr a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
B.ManagedPtr.wrapPtr ManagedPtr DrawStateT -> DrawStateT
DrawStateT)
    boxedPtrFree :: DrawStateT -> IO ()
boxedPtrFree = \DrawStateT
x -> DrawStateT -> (Ptr DrawStateT -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
SP.withManagedPtr DrawStateT
x Ptr DrawStateT -> IO ()
forall a. Ptr a -> IO ()
SP.freeMem
instance CallocPtr DrawStateT where
    boxedPtrCalloc :: IO (Ptr DrawStateT)
boxedPtrCalloc = Int -> IO (Ptr DrawStateT)
forall a. Int -> IO (Ptr a)
callocBytes Int
48
newZeroDrawStateT :: MonadIO m => m DrawStateT
newZeroDrawStateT :: forall (m :: * -> *). MonadIO m => m DrawStateT
newZeroDrawStateT = IO DrawStateT -> m DrawStateT
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO DrawStateT -> m DrawStateT) -> IO DrawStateT -> m DrawStateT
forall a b. (a -> b) -> a -> b
$ IO (Ptr DrawStateT)
forall a. CallocPtr a => IO (Ptr a)
boxedPtrCalloc IO (Ptr DrawStateT)
-> (Ptr DrawStateT -> IO DrawStateT) -> IO DrawStateT
forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= (ManagedPtr DrawStateT -> DrawStateT)
-> Ptr DrawStateT -> IO DrawStateT
forall a.
(HasCallStack, BoxedPtr a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
wrapPtr ManagedPtr DrawStateT -> DrawStateT
DrawStateT
instance tag ~ 'AttrSet => Constructible DrawStateT tag where
    new :: forall (m :: * -> *).
MonadIO m =>
(ManagedPtr DrawStateT -> DrawStateT)
-> [AttrOp DrawStateT tag] -> m DrawStateT
new ManagedPtr DrawStateT -> DrawStateT
_ [AttrOp DrawStateT tag]
attrs = do
        DrawStateT
o <- m DrawStateT
forall (m :: * -> *). MonadIO m => m DrawStateT
newZeroDrawStateT
        DrawStateT -> [AttrOp DrawStateT 'AttrSet] -> m ()
forall o (m :: * -> *).
MonadIO m =>
o -> [AttrOp o 'AttrSet] -> m ()
GI.Attributes.set DrawStateT
o [AttrOp DrawStateT tag]
[AttrOp DrawStateT 'AttrSet]
attrs
        DrawStateT -> m DrawStateT
forall (m :: * -> *) a. Monad m => a -> m a
return DrawStateT
o
getDrawStateTPathOpen :: MonadIO m => DrawStateT -> m Int32
getDrawStateTPathOpen :: forall (m :: * -> *). MonadIO m => DrawStateT -> m Int32
getDrawStateTPathOpen DrawStateT
s = IO Int32 -> m Int32
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Int32 -> m Int32) -> IO Int32 -> m Int32
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO Int32) -> IO Int32
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO Int32) -> IO Int32)
-> (Ptr DrawStateT -> IO Int32) -> IO Int32
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    Int32
val <- Ptr Int32 -> IO Int32
forall a. Storable a => Ptr a -> IO a
peek (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr Int32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0) :: IO Int32
    Int32 -> IO Int32
forall (m :: * -> *) a. Monad m => a -> m a
return Int32
val
setDrawStateTPathOpen :: MonadIO m => DrawStateT -> Int32 -> m ()
setDrawStateTPathOpen :: forall (m :: * -> *). MonadIO m => DrawStateT -> Int32 -> m ()
setDrawStateTPathOpen DrawStateT
s Int32
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO ()) -> IO ())
-> (Ptr DrawStateT -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    Ptr Int32 -> Int32 -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr Int32
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0) (Int32
val :: Int32)
#if defined(ENABLE_OVERLOADING)
data DrawStateTPathOpenFieldInfo
instance AttrInfo DrawStateTPathOpenFieldInfo where
    type AttrBaseTypeConstraint DrawStateTPathOpenFieldInfo = (~) DrawStateT
    type AttrAllowedOps DrawStateTPathOpenFieldInfo = '[ 'AttrSet, 'AttrGet]
    type AttrSetTypeConstraint DrawStateTPathOpenFieldInfo = (~) Int32
    type AttrTransferTypeConstraint DrawStateTPathOpenFieldInfo = (~)Int32
    type AttrTransferType DrawStateTPathOpenFieldInfo = Int32
    type AttrGetType DrawStateTPathOpenFieldInfo = Int32
    type AttrLabel DrawStateTPathOpenFieldInfo = "path_open"
    type AttrOrigin DrawStateTPathOpenFieldInfo = DrawStateT
    attrGet = getDrawStateTPathOpen
    attrSet = setDrawStateTPathOpen
    attrConstruct = undefined
    attrClear = undefined
    attrTransfer _ v = do
        return v
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.HarfBuzz.Structs.DrawStateT.pathOpen"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-harfbuzz-0.0.6/docs/GI-HarfBuzz-Structs-DrawStateT.html#g:attr:pathOpen"
        })
drawStateT_pathOpen :: AttrLabelProxy "pathOpen"
drawStateT_pathOpen = AttrLabelProxy
#endif
getDrawStateTPathStartX :: MonadIO m => DrawStateT -> m Float
getDrawStateTPathStartX :: forall (m :: * -> *). MonadIO m => DrawStateT -> m Float
getDrawStateTPathStartX DrawStateT
s = IO Float -> m Float
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Float -> m Float) -> IO Float -> m Float
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO Float) -> IO Float
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO Float) -> IO Float)
-> (Ptr DrawStateT -> IO Float) -> IO Float
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    CFloat
val <- Ptr CFloat -> IO CFloat
forall a. Storable a => Ptr a -> IO a
peek (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
4) :: IO CFloat
    let val' :: Float
val' = CFloat -> Float
forall a b. (Real a, Fractional b) => a -> b
realToFrac CFloat
val
    Float -> IO Float
forall (m :: * -> *) a. Monad m => a -> m a
return Float
val'
setDrawStateTPathStartX :: MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTPathStartX :: forall (m :: * -> *). MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTPathStartX DrawStateT
s Float
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO ()) -> IO ())
-> (Ptr DrawStateT -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    let val' :: CFloat
val' = Float -> CFloat
forall a b. (Real a, Fractional b) => a -> b
realToFrac Float
val
    Ptr CFloat -> CFloat -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
4) (CFloat
val' :: CFloat)
#if defined(ENABLE_OVERLOADING)
data DrawStateTPathStartXFieldInfo
instance AttrInfo DrawStateTPathStartXFieldInfo where
    type AttrBaseTypeConstraint DrawStateTPathStartXFieldInfo = (~) DrawStateT
    type AttrAllowedOps DrawStateTPathStartXFieldInfo = '[ 'AttrSet, 'AttrGet]
    type AttrSetTypeConstraint DrawStateTPathStartXFieldInfo = (~) Float
    type AttrTransferTypeConstraint DrawStateTPathStartXFieldInfo = (~)Float
    type AttrTransferType DrawStateTPathStartXFieldInfo = Float
    type AttrGetType DrawStateTPathStartXFieldInfo = Float
    type AttrLabel DrawStateTPathStartXFieldInfo = "path_start_x"
    type AttrOrigin DrawStateTPathStartXFieldInfo = DrawStateT
    attrGet = getDrawStateTPathStartX
    attrSet = setDrawStateTPathStartX
    attrConstruct = undefined
    attrClear = undefined
    attrTransfer _ v = do
        return v
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.HarfBuzz.Structs.DrawStateT.pathStartX"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-harfbuzz-0.0.6/docs/GI-HarfBuzz-Structs-DrawStateT.html#g:attr:pathStartX"
        })
drawStateT_pathStartX :: AttrLabelProxy "pathStartX"
drawStateT_pathStartX = AttrLabelProxy
#endif
getDrawStateTPathStartY :: MonadIO m => DrawStateT -> m Float
getDrawStateTPathStartY :: forall (m :: * -> *). MonadIO m => DrawStateT -> m Float
getDrawStateTPathStartY DrawStateT
s = IO Float -> m Float
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Float -> m Float) -> IO Float -> m Float
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO Float) -> IO Float
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO Float) -> IO Float)
-> (Ptr DrawStateT -> IO Float) -> IO Float
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    CFloat
val <- Ptr CFloat -> IO CFloat
forall a. Storable a => Ptr a -> IO a
peek (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8) :: IO CFloat
    let val' :: Float
val' = CFloat -> Float
forall a b. (Real a, Fractional b) => a -> b
realToFrac CFloat
val
    Float -> IO Float
forall (m :: * -> *) a. Monad m => a -> m a
return Float
val'
setDrawStateTPathStartY :: MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTPathStartY :: forall (m :: * -> *). MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTPathStartY DrawStateT
s Float
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO ()) -> IO ())
-> (Ptr DrawStateT -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    let val' :: CFloat
val' = Float -> CFloat
forall a b. (Real a, Fractional b) => a -> b
realToFrac Float
val
    Ptr CFloat -> CFloat -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8) (CFloat
val' :: CFloat)
#if defined(ENABLE_OVERLOADING)
data DrawStateTPathStartYFieldInfo
instance AttrInfo DrawStateTPathStartYFieldInfo where
    type AttrBaseTypeConstraint DrawStateTPathStartYFieldInfo = (~) DrawStateT
    type AttrAllowedOps DrawStateTPathStartYFieldInfo = '[ 'AttrSet, 'AttrGet]
    type AttrSetTypeConstraint DrawStateTPathStartYFieldInfo = (~) Float
    type AttrTransferTypeConstraint DrawStateTPathStartYFieldInfo = (~)Float
    type AttrTransferType DrawStateTPathStartYFieldInfo = Float
    type AttrGetType DrawStateTPathStartYFieldInfo = Float
    type AttrLabel DrawStateTPathStartYFieldInfo = "path_start_y"
    type AttrOrigin DrawStateTPathStartYFieldInfo = DrawStateT
    attrGet = getDrawStateTPathStartY
    attrSet = setDrawStateTPathStartY
    attrConstruct = undefined
    attrClear = undefined
    attrTransfer _ v = do
        return v
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.HarfBuzz.Structs.DrawStateT.pathStartY"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-harfbuzz-0.0.6/docs/GI-HarfBuzz-Structs-DrawStateT.html#g:attr:pathStartY"
        })
drawStateT_pathStartY :: AttrLabelProxy "pathStartY"
drawStateT_pathStartY = AttrLabelProxy
#endif
getDrawStateTCurrentX :: MonadIO m => DrawStateT -> m Float
getDrawStateTCurrentX :: forall (m :: * -> *). MonadIO m => DrawStateT -> m Float
getDrawStateTCurrentX DrawStateT
s = IO Float -> m Float
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Float -> m Float) -> IO Float -> m Float
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO Float) -> IO Float
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO Float) -> IO Float)
-> (Ptr DrawStateT -> IO Float) -> IO Float
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    CFloat
val <- Ptr CFloat -> IO CFloat
forall a. Storable a => Ptr a -> IO a
peek (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
12) :: IO CFloat
    let val' :: Float
val' = CFloat -> Float
forall a b. (Real a, Fractional b) => a -> b
realToFrac CFloat
val
    Float -> IO Float
forall (m :: * -> *) a. Monad m => a -> m a
return Float
val'
setDrawStateTCurrentX :: MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTCurrentX :: forall (m :: * -> *). MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTCurrentX DrawStateT
s Float
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO ()) -> IO ())
-> (Ptr DrawStateT -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    let val' :: CFloat
val' = Float -> CFloat
forall a b. (Real a, Fractional b) => a -> b
realToFrac Float
val
    Ptr CFloat -> CFloat -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
12) (CFloat
val' :: CFloat)
#if defined(ENABLE_OVERLOADING)
data DrawStateTCurrentXFieldInfo
instance AttrInfo DrawStateTCurrentXFieldInfo where
    type AttrBaseTypeConstraint DrawStateTCurrentXFieldInfo = (~) DrawStateT
    type AttrAllowedOps DrawStateTCurrentXFieldInfo = '[ 'AttrSet, 'AttrGet]
    type AttrSetTypeConstraint DrawStateTCurrentXFieldInfo = (~) Float
    type AttrTransferTypeConstraint DrawStateTCurrentXFieldInfo = (~)Float
    type AttrTransferType DrawStateTCurrentXFieldInfo = Float
    type AttrGetType DrawStateTCurrentXFieldInfo = Float
    type AttrLabel DrawStateTCurrentXFieldInfo = "current_x"
    type AttrOrigin DrawStateTCurrentXFieldInfo = DrawStateT
    attrGet = getDrawStateTCurrentX
    attrSet = setDrawStateTCurrentX
    attrConstruct = undefined
    attrClear = undefined
    attrTransfer _ v = do
        return v
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.HarfBuzz.Structs.DrawStateT.currentX"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-harfbuzz-0.0.6/docs/GI-HarfBuzz-Structs-DrawStateT.html#g:attr:currentX"
        })
drawStateT_currentX :: AttrLabelProxy "currentX"
drawStateT_currentX = AttrLabelProxy
#endif
getDrawStateTCurrentY :: MonadIO m => DrawStateT -> m Float
getDrawStateTCurrentY :: forall (m :: * -> *). MonadIO m => DrawStateT -> m Float
getDrawStateTCurrentY DrawStateT
s = IO Float -> m Float
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO Float -> m Float) -> IO Float -> m Float
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO Float) -> IO Float
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO Float) -> IO Float)
-> (Ptr DrawStateT -> IO Float) -> IO Float
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    CFloat
val <- Ptr CFloat -> IO CFloat
forall a. Storable a => Ptr a -> IO a
peek (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16) :: IO CFloat
    let val' :: Float
val' = CFloat -> Float
forall a b. (Real a, Fractional b) => a -> b
realToFrac CFloat
val
    Float -> IO Float
forall (m :: * -> *) a. Monad m => a -> m a
return Float
val'
setDrawStateTCurrentY :: MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTCurrentY :: forall (m :: * -> *). MonadIO m => DrawStateT -> Float -> m ()
setDrawStateTCurrentY DrawStateT
s Float
val = IO () -> m ()
forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO (IO () -> m ()) -> IO () -> m ()
forall a b. (a -> b) -> a -> b
$ DrawStateT -> (Ptr DrawStateT -> IO ()) -> IO ()
forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr DrawStateT
s ((Ptr DrawStateT -> IO ()) -> IO ())
-> (Ptr DrawStateT -> IO ()) -> IO ()
forall a b. (a -> b) -> a -> b
$ \Ptr DrawStateT
ptr -> do
    let val' :: CFloat
val' = Float -> CFloat
forall a b. (Real a, Fractional b) => a -> b
realToFrac Float
val
    Ptr CFloat -> CFloat -> IO ()
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr DrawStateT
ptr Ptr DrawStateT -> Int -> Ptr CFloat
forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16) (CFloat
val' :: CFloat)
#if defined(ENABLE_OVERLOADING)
data DrawStateTCurrentYFieldInfo
instance AttrInfo DrawStateTCurrentYFieldInfo where
    type AttrBaseTypeConstraint DrawStateTCurrentYFieldInfo = (~) DrawStateT
    type AttrAllowedOps DrawStateTCurrentYFieldInfo = '[ 'AttrSet, 'AttrGet]
    type AttrSetTypeConstraint DrawStateTCurrentYFieldInfo = (~) Float
    type AttrTransferTypeConstraint DrawStateTCurrentYFieldInfo = (~)Float
    type AttrTransferType DrawStateTCurrentYFieldInfo = Float
    type AttrGetType DrawStateTCurrentYFieldInfo = Float
    type AttrLabel DrawStateTCurrentYFieldInfo = "current_y"
    type AttrOrigin DrawStateTCurrentYFieldInfo = DrawStateT
    attrGet = getDrawStateTCurrentY
    attrSet = setDrawStateTCurrentY
    attrConstruct = undefined
    attrClear = undefined
    attrTransfer _ v = do
        return v
    dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
        O.resolvedSymbolName = "GI.HarfBuzz.Structs.DrawStateT.currentY"
        , O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-harfbuzz-0.0.6/docs/GI-HarfBuzz-Structs-DrawStateT.html#g:attr:currentY"
        })
drawStateT_currentY :: AttrLabelProxy "currentY"
drawStateT_currentY = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList DrawStateT
type instance O.AttributeList DrawStateT = DrawStateTAttributeList
type DrawStateTAttributeList = ('[ '("pathOpen", DrawStateTPathOpenFieldInfo), '("pathStartX", DrawStateTPathStartXFieldInfo), '("pathStartY", DrawStateTPathStartYFieldInfo), '("currentX", DrawStateTCurrentXFieldInfo), '("currentY", DrawStateTCurrentYFieldInfo)] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
type family ResolveDrawStateTMethod (t :: Symbol) (o :: *) :: * where
    ResolveDrawStateTMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveDrawStateTMethod t DrawStateT, O.OverloadedMethod info DrawStateT p) => OL.IsLabel t (DrawStateT -> p) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.overloadedMethod @info
#else
    fromLabel _ = O.overloadedMethod @info
#endif
#if MIN_VERSION_base(4,13,0)
instance (info ~ ResolveDrawStateTMethod t DrawStateT, O.OverloadedMethod info DrawStateT p, R.HasField t DrawStateT p) => R.HasField t DrawStateT p where
    getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveDrawStateTMethod t DrawStateT, O.OverloadedMethodInfo info DrawStateT) => OL.IsLabel t (O.MethodProxy info DrawStateT) where
#if MIN_VERSION_base(4,10,0)
    fromLabel = O.MethodProxy
#else
    fromLabel _ = O.MethodProxy
#endif
#endif