{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.OSTree.Structs.RepoCheckoutAtOptions
(
RepoCheckoutAtOptions(..) ,
newZeroRepoCheckoutAtOptions ,
#if defined(ENABLE_OVERLOADING)
ResolveRepoCheckoutAtOptionsMethod ,
#endif
#if defined(ENABLE_OVERLOADING)
RepoCheckoutAtOptionsSetDevinoMethodInfo,
#endif
repoCheckoutAtOptionsSetDevino ,
getRepoCheckoutAtOptionsBareuseronlyDirs,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_bareuseronlyDirs ,
#endif
setRepoCheckoutAtOptionsBareuseronlyDirs,
clearRepoCheckoutAtOptionsDevinoToCsumCache,
getRepoCheckoutAtOptionsDevinoToCsumCache,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_devinoToCsumCache ,
#endif
setRepoCheckoutAtOptionsDevinoToCsumCache,
getRepoCheckoutAtOptionsEnableFsync ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_enableFsync ,
#endif
setRepoCheckoutAtOptionsEnableFsync ,
getRepoCheckoutAtOptionsEnableUncompressedCache,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_enableUncompressedCache,
#endif
setRepoCheckoutAtOptionsEnableUncompressedCache,
clearRepoCheckoutAtOptionsFilter ,
getRepoCheckoutAtOptionsFilter ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_filter ,
#endif
setRepoCheckoutAtOptionsFilter ,
clearRepoCheckoutAtOptionsFilterUserData,
getRepoCheckoutAtOptionsFilterUserData ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_filterUserData ,
#endif
setRepoCheckoutAtOptionsFilterUserData ,
getRepoCheckoutAtOptionsForceCopy ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_forceCopy ,
#endif
setRepoCheckoutAtOptionsForceCopy ,
getRepoCheckoutAtOptionsForceCopyZerosized,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_forceCopyZerosized,
#endif
setRepoCheckoutAtOptionsForceCopyZerosized,
getRepoCheckoutAtOptionsMode ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_mode ,
#endif
setRepoCheckoutAtOptionsMode ,
getRepoCheckoutAtOptionsNoCopyFallback ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_noCopyFallback ,
#endif
setRepoCheckoutAtOptionsNoCopyFallback ,
getRepoCheckoutAtOptionsOverwriteMode ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_overwriteMode ,
#endif
setRepoCheckoutAtOptionsOverwriteMode ,
getRepoCheckoutAtOptionsProcessPassthroughWhiteouts,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_processPassthroughWhiteouts,
#endif
setRepoCheckoutAtOptionsProcessPassthroughWhiteouts,
getRepoCheckoutAtOptionsProcessWhiteouts,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_processWhiteouts ,
#endif
setRepoCheckoutAtOptionsProcessWhiteouts,
clearRepoCheckoutAtOptionsSepolicy ,
getRepoCheckoutAtOptionsSepolicy ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_sepolicy ,
#endif
setRepoCheckoutAtOptionsSepolicy ,
clearRepoCheckoutAtOptionsSepolicyPrefix,
getRepoCheckoutAtOptionsSepolicyPrefix ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_sepolicyPrefix ,
#endif
setRepoCheckoutAtOptionsSepolicyPrefix ,
clearRepoCheckoutAtOptionsSubpath ,
getRepoCheckoutAtOptionsSubpath ,
#if defined(ENABLE_OVERLOADING)
repoCheckoutAtOptions_subpath ,
#endif
setRepoCheckoutAtOptionsSubpath ,
) 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
import qualified GI.OSTree.Callbacks as OSTree.Callbacks
import {-# SOURCE #-} qualified GI.OSTree.Enums as OSTree.Enums
import {-# SOURCE #-} qualified GI.OSTree.Objects.SePolicy as OSTree.SePolicy
import {-# SOURCE #-} qualified GI.OSTree.Structs.RepoDevInoCache as OSTree.RepoDevInoCache
newtype RepoCheckoutAtOptions = RepoCheckoutAtOptions (SP.ManagedPtr RepoCheckoutAtOptions)
deriving (RepoCheckoutAtOptions -> RepoCheckoutAtOptions -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: RepoCheckoutAtOptions -> RepoCheckoutAtOptions -> Bool
$c/= :: RepoCheckoutAtOptions -> RepoCheckoutAtOptions -> Bool
== :: RepoCheckoutAtOptions -> RepoCheckoutAtOptions -> Bool
$c== :: RepoCheckoutAtOptions -> RepoCheckoutAtOptions -> Bool
Eq)
instance SP.ManagedPtrNewtype RepoCheckoutAtOptions where
toManagedPtr :: RepoCheckoutAtOptions -> ManagedPtr RepoCheckoutAtOptions
toManagedPtr (RepoCheckoutAtOptions ManagedPtr RepoCheckoutAtOptions
p) = ManagedPtr RepoCheckoutAtOptions
p
instance BoxedPtr RepoCheckoutAtOptions where
boxedPtrCopy :: RepoCheckoutAtOptions -> IO RepoCheckoutAtOptions
boxedPtrCopy = \RepoCheckoutAtOptions
p -> forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
B.ManagedPtr.withManagedPtr RepoCheckoutAtOptions
p (forall a. (HasCallStack, CallocPtr a) => Int -> Ptr a -> IO (Ptr a)
copyBytes Int
152 forall (m :: * -> *) a b c.
Monad m =>
(a -> m b) -> (b -> m c) -> a -> m c
>=> forall a.
(HasCallStack, BoxedPtr a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
B.ManagedPtr.wrapPtr ManagedPtr RepoCheckoutAtOptions -> RepoCheckoutAtOptions
RepoCheckoutAtOptions)
boxedPtrFree :: RepoCheckoutAtOptions -> IO ()
boxedPtrFree = \RepoCheckoutAtOptions
x -> forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
SP.withManagedPtr RepoCheckoutAtOptions
x forall a. Ptr a -> IO ()
SP.freeMem
instance CallocPtr RepoCheckoutAtOptions where
boxedPtrCalloc :: IO (Ptr RepoCheckoutAtOptions)
boxedPtrCalloc = forall a. Int -> IO (Ptr a)
callocBytes Int
152
newZeroRepoCheckoutAtOptions :: MonadIO m => m RepoCheckoutAtOptions
newZeroRepoCheckoutAtOptions :: forall (m :: * -> *). MonadIO m => m RepoCheckoutAtOptions
newZeroRepoCheckoutAtOptions = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a. CallocPtr a => IO (Ptr a)
boxedPtrCalloc forall (m :: * -> *) a b. Monad m => m a -> (a -> m b) -> m b
>>= forall a.
(HasCallStack, BoxedPtr a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
wrapPtr ManagedPtr RepoCheckoutAtOptions -> RepoCheckoutAtOptions
RepoCheckoutAtOptions
instance tag ~ 'AttrSet => Constructible RepoCheckoutAtOptions tag where
new :: forall (m :: * -> *).
MonadIO m =>
(ManagedPtr RepoCheckoutAtOptions -> RepoCheckoutAtOptions)
-> [AttrOp RepoCheckoutAtOptions tag] -> m RepoCheckoutAtOptions
new ManagedPtr RepoCheckoutAtOptions -> RepoCheckoutAtOptions
_ [AttrOp RepoCheckoutAtOptions tag]
attrs = do
RepoCheckoutAtOptions
o <- forall (m :: * -> *). MonadIO m => m RepoCheckoutAtOptions
newZeroRepoCheckoutAtOptions
forall o (m :: * -> *).
MonadIO m =>
o -> [AttrOp o 'AttrSet] -> m ()
GI.Attributes.set RepoCheckoutAtOptions
o [AttrOp RepoCheckoutAtOptions tag]
attrs
forall (m :: * -> *) a. Monad m => a -> m a
return RepoCheckoutAtOptions
o
getRepoCheckoutAtOptionsMode :: MonadIO m => RepoCheckoutAtOptions -> m OSTree.Enums.RepoCheckoutMode
getRepoCheckoutAtOptionsMode :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m RepoCheckoutMode
getRepoCheckoutAtOptionsMode RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CUInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0) :: IO CUInt
let val' :: RepoCheckoutMode
val' = (forall a. Enum a => Int -> a
toEnum forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. (Integral a, Num b) => a -> b
fromIntegral) CUInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return RepoCheckoutMode
val'
setRepoCheckoutAtOptionsMode :: MonadIO m => RepoCheckoutAtOptions -> OSTree.Enums.RepoCheckoutMode -> m ()
setRepoCheckoutAtOptionsMode :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> RepoCheckoutMode -> m ()
setRepoCheckoutAtOptionsMode RepoCheckoutAtOptions
s RepoCheckoutMode
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CUInt
val' = (forall a b. (Integral a, Num b) => a -> b
fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
fromEnum) RepoCheckoutMode
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
0) (CUInt
val' :: CUInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsModeFieldInfo
instance AttrInfo RepoCheckoutAtOptionsModeFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsModeFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsModeFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsModeFieldInfo = (~) OSTree.Enums.RepoCheckoutMode
type AttrTransferTypeConstraint RepoCheckoutAtOptionsModeFieldInfo = (~)OSTree.Enums.RepoCheckoutMode
type AttrTransferType RepoCheckoutAtOptionsModeFieldInfo = OSTree.Enums.RepoCheckoutMode
type AttrGetType RepoCheckoutAtOptionsModeFieldInfo = OSTree.Enums.RepoCheckoutMode
type AttrLabel RepoCheckoutAtOptionsModeFieldInfo = "mode"
type AttrOrigin RepoCheckoutAtOptionsModeFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsMode
attrSet = setRepoCheckoutAtOptionsMode
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.mode"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:mode"
})
repoCheckoutAtOptions_mode :: AttrLabelProxy "mode"
repoCheckoutAtOptions_mode = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsOverwriteMode :: MonadIO m => RepoCheckoutAtOptions -> m OSTree.Enums.RepoCheckoutOverwriteMode
getRepoCheckoutAtOptionsOverwriteMode :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m RepoCheckoutOverwriteMode
getRepoCheckoutAtOptionsOverwriteMode RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CUInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
4) :: IO CUInt
let val' :: RepoCheckoutOverwriteMode
val' = (forall a. Enum a => Int -> a
toEnum forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. (Integral a, Num b) => a -> b
fromIntegral) CUInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return RepoCheckoutOverwriteMode
val'
setRepoCheckoutAtOptionsOverwriteMode :: MonadIO m => RepoCheckoutAtOptions -> OSTree.Enums.RepoCheckoutOverwriteMode -> m ()
setRepoCheckoutAtOptionsOverwriteMode :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> RepoCheckoutOverwriteMode -> m ()
setRepoCheckoutAtOptionsOverwriteMode RepoCheckoutAtOptions
s RepoCheckoutOverwriteMode
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CUInt
val' = (forall a b. (Integral a, Num b) => a -> b
fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
fromEnum) RepoCheckoutOverwriteMode
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
4) (CUInt
val' :: CUInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsOverwriteModeFieldInfo
instance AttrInfo RepoCheckoutAtOptionsOverwriteModeFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsOverwriteModeFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsOverwriteModeFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsOverwriteModeFieldInfo = (~) OSTree.Enums.RepoCheckoutOverwriteMode
type AttrTransferTypeConstraint RepoCheckoutAtOptionsOverwriteModeFieldInfo = (~)OSTree.Enums.RepoCheckoutOverwriteMode
type AttrTransferType RepoCheckoutAtOptionsOverwriteModeFieldInfo = OSTree.Enums.RepoCheckoutOverwriteMode
type AttrGetType RepoCheckoutAtOptionsOverwriteModeFieldInfo = OSTree.Enums.RepoCheckoutOverwriteMode
type AttrLabel RepoCheckoutAtOptionsOverwriteModeFieldInfo = "overwrite_mode"
type AttrOrigin RepoCheckoutAtOptionsOverwriteModeFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsOverwriteMode
attrSet = setRepoCheckoutAtOptionsOverwriteMode
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.overwriteMode"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:overwriteMode"
})
repoCheckoutAtOptions_overwriteMode :: AttrLabelProxy "overwriteMode"
repoCheckoutAtOptions_overwriteMode = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsEnableUncompressedCache :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsEnableUncompressedCache :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsEnableUncompressedCache RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsEnableUncompressedCache :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsEnableUncompressedCache :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsEnableUncompressedCache RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
8) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo
instance AttrInfo RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = "enable_uncompressed_cache"
type AttrOrigin RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsEnableUncompressedCache
attrSet = setRepoCheckoutAtOptionsEnableUncompressedCache
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.enableUncompressedCache"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:enableUncompressedCache"
})
repoCheckoutAtOptions_enableUncompressedCache :: AttrLabelProxy "enableUncompressedCache"
repoCheckoutAtOptions_enableUncompressedCache = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsEnableFsync :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsEnableFsync :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsEnableFsync RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
12) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsEnableFsync :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsEnableFsync :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsEnableFsync RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
12) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsEnableFsyncFieldInfo
instance AttrInfo RepoCheckoutAtOptionsEnableFsyncFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsEnableFsyncFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsEnableFsyncFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsEnableFsyncFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsEnableFsyncFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsEnableFsyncFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsEnableFsyncFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsEnableFsyncFieldInfo = "enable_fsync"
type AttrOrigin RepoCheckoutAtOptionsEnableFsyncFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsEnableFsync
attrSet = setRepoCheckoutAtOptionsEnableFsync
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.enableFsync"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:enableFsync"
})
repoCheckoutAtOptions_enableFsync :: AttrLabelProxy "enableFsync"
repoCheckoutAtOptions_enableFsync = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsProcessWhiteouts :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsProcessWhiteouts :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsProcessWhiteouts RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsProcessWhiteouts :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsProcessWhiteouts :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsProcessWhiteouts RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
16) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo
instance AttrInfo RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = "process_whiteouts"
type AttrOrigin RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsProcessWhiteouts
attrSet = setRepoCheckoutAtOptionsProcessWhiteouts
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.processWhiteouts"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:processWhiteouts"
})
repoCheckoutAtOptions_processWhiteouts :: AttrLabelProxy "processWhiteouts"
repoCheckoutAtOptions_processWhiteouts = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsNoCopyFallback :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsNoCopyFallback :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsNoCopyFallback RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsNoCopyFallback :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsNoCopyFallback :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsNoCopyFallback RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
20) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsNoCopyFallbackFieldInfo
instance AttrInfo RepoCheckoutAtOptionsNoCopyFallbackFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = "no_copy_fallback"
type AttrOrigin RepoCheckoutAtOptionsNoCopyFallbackFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsNoCopyFallback
attrSet = setRepoCheckoutAtOptionsNoCopyFallback
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.noCopyFallback"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:noCopyFallback"
})
repoCheckoutAtOptions_noCopyFallback :: AttrLabelProxy "noCopyFallback"
repoCheckoutAtOptions_noCopyFallback = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsForceCopy :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsForceCopy :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsForceCopy RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
24) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsForceCopy :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsForceCopy :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsForceCopy RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
24) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsForceCopyFieldInfo
instance AttrInfo RepoCheckoutAtOptionsForceCopyFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsForceCopyFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsForceCopyFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsForceCopyFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsForceCopyFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsForceCopyFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsForceCopyFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsForceCopyFieldInfo = "force_copy"
type AttrOrigin RepoCheckoutAtOptionsForceCopyFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsForceCopy
attrSet = setRepoCheckoutAtOptionsForceCopy
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.forceCopy"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:forceCopy"
})
repoCheckoutAtOptions_forceCopy :: AttrLabelProxy "forceCopy"
repoCheckoutAtOptions_forceCopy = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsBareuseronlyDirs :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsBareuseronlyDirs :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsBareuseronlyDirs RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
28) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsBareuseronlyDirs :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsBareuseronlyDirs :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsBareuseronlyDirs RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
28) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo
instance AttrInfo RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = "bareuseronly_dirs"
type AttrOrigin RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsBareuseronlyDirs
attrSet = setRepoCheckoutAtOptionsBareuseronlyDirs
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.bareuseronlyDirs"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:bareuseronlyDirs"
})
repoCheckoutAtOptions_bareuseronlyDirs :: AttrLabelProxy "bareuseronlyDirs"
repoCheckoutAtOptions_bareuseronlyDirs = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsForceCopyZerosized :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsForceCopyZerosized :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsForceCopyZerosized RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
32) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsForceCopyZerosized :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsForceCopyZerosized :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsForceCopyZerosized RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
32) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo
instance AttrInfo RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = "force_copy_zerosized"
type AttrOrigin RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsForceCopyZerosized
attrSet = setRepoCheckoutAtOptionsForceCopyZerosized
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.forceCopyZerosized"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:forceCopyZerosized"
})
repoCheckoutAtOptions_forceCopyZerosized :: AttrLabelProxy "forceCopyZerosized"
repoCheckoutAtOptions_forceCopyZerosized = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsProcessPassthroughWhiteouts :: MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsProcessPassthroughWhiteouts :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m Bool
getRepoCheckoutAtOptionsProcessPassthroughWhiteouts RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CInt
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
36) :: IO CInt
let val' :: Bool
val' = (forall a. Eq a => a -> a -> Bool
/= CInt
0) CInt
val
forall (m :: * -> *) a. Monad m => a -> m a
return Bool
val'
setRepoCheckoutAtOptionsProcessPassthroughWhiteouts :: MonadIO m => RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsProcessPassthroughWhiteouts :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Bool -> m ()
setRepoCheckoutAtOptionsProcessPassthroughWhiteouts RepoCheckoutAtOptions
s Bool
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
let val' :: CInt
val' = (forall a b. (Integral a, Num b) => a -> b
P.fromIntegral forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a. Enum a => a -> Int
P.fromEnum) Bool
val
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
36) (CInt
val' :: CInt)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo
instance AttrInfo RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = (~) Bool
type AttrTransferTypeConstraint RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = (~)Bool
type AttrTransferType RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = Bool
type AttrGetType RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = Bool
type AttrLabel RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = "process_passthrough_whiteouts"
type AttrOrigin RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsProcessPassthroughWhiteouts
attrSet = setRepoCheckoutAtOptionsProcessPassthroughWhiteouts
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.processPassthroughWhiteouts"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:processPassthroughWhiteouts"
})
repoCheckoutAtOptions_processPassthroughWhiteouts :: AttrLabelProxy "processPassthroughWhiteouts"
repoCheckoutAtOptions_processPassthroughWhiteouts = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsSubpath :: MonadIO m => RepoCheckoutAtOptions -> m (Maybe T.Text)
getRepoCheckoutAtOptionsSubpath :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m (Maybe Text)
getRepoCheckoutAtOptionsSubpath RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CString
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
56) :: IO CString
Maybe Text
result <- forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
SP.convertIfNonNull CString
val forall a b. (a -> b) -> a -> b
$ \CString
val' -> do
Text
val'' <- HasCallStack => CString -> IO Text
cstringToText CString
val'
forall (m :: * -> *) a. Monad m => a -> m a
return Text
val''
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe Text
result
setRepoCheckoutAtOptionsSubpath :: MonadIO m => RepoCheckoutAtOptions -> CString -> m ()
setRepoCheckoutAtOptionsSubpath :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> CString -> m ()
setRepoCheckoutAtOptionsSubpath RepoCheckoutAtOptions
s CString
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
56) (CString
val :: CString)
clearRepoCheckoutAtOptionsSubpath :: MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsSubpath :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsSubpath RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
56) (forall a. Ptr a
FP.nullPtr :: CString)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsSubpathFieldInfo
instance AttrInfo RepoCheckoutAtOptionsSubpathFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsSubpathFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsSubpathFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint RepoCheckoutAtOptionsSubpathFieldInfo = (~) CString
type AttrTransferTypeConstraint RepoCheckoutAtOptionsSubpathFieldInfo = (~)CString
type AttrTransferType RepoCheckoutAtOptionsSubpathFieldInfo = CString
type AttrGetType RepoCheckoutAtOptionsSubpathFieldInfo = Maybe T.Text
type AttrLabel RepoCheckoutAtOptionsSubpathFieldInfo = "subpath"
type AttrOrigin RepoCheckoutAtOptionsSubpathFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsSubpath
attrSet = setRepoCheckoutAtOptionsSubpath
attrConstruct = undefined
attrClear = clearRepoCheckoutAtOptionsSubpath
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.subpath"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:subpath"
})
repoCheckoutAtOptions_subpath :: AttrLabelProxy "subpath"
repoCheckoutAtOptions_subpath = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsDevinoToCsumCache :: MonadIO m => RepoCheckoutAtOptions -> m (Maybe OSTree.RepoDevInoCache.RepoDevInoCache)
getRepoCheckoutAtOptionsDevinoToCsumCache :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m (Maybe RepoDevInoCache)
getRepoCheckoutAtOptionsDevinoToCsumCache RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
Ptr RepoDevInoCache
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
64) :: IO (Ptr OSTree.RepoDevInoCache.RepoDevInoCache)
Maybe RepoDevInoCache
result <- forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
SP.convertIfNonNull Ptr RepoDevInoCache
val forall a b. (a -> b) -> a -> b
$ \Ptr RepoDevInoCache
val' -> do
RepoDevInoCache
val'' <- (forall a.
(HasCallStack, GBoxed a) =>
(ManagedPtr a -> a) -> Ptr a -> IO a
newBoxed ManagedPtr RepoDevInoCache -> RepoDevInoCache
OSTree.RepoDevInoCache.RepoDevInoCache) Ptr RepoDevInoCache
val'
forall (m :: * -> *) a. Monad m => a -> m a
return RepoDevInoCache
val''
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe RepoDevInoCache
result
setRepoCheckoutAtOptionsDevinoToCsumCache :: MonadIO m => RepoCheckoutAtOptions -> Ptr OSTree.RepoDevInoCache.RepoDevInoCache -> m ()
setRepoCheckoutAtOptionsDevinoToCsumCache :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Ptr RepoDevInoCache -> m ()
setRepoCheckoutAtOptionsDevinoToCsumCache RepoCheckoutAtOptions
s Ptr RepoDevInoCache
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
64) (Ptr RepoDevInoCache
val :: Ptr OSTree.RepoDevInoCache.RepoDevInoCache)
clearRepoCheckoutAtOptionsDevinoToCsumCache :: MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsDevinoToCsumCache :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsDevinoToCsumCache RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
64) (forall a. Ptr a
FP.nullPtr :: Ptr OSTree.RepoDevInoCache.RepoDevInoCache)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo
instance AttrInfo RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = (~) (Ptr OSTree.RepoDevInoCache.RepoDevInoCache)
type AttrTransferTypeConstraint RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = (~)(Ptr OSTree.RepoDevInoCache.RepoDevInoCache)
type AttrTransferType RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = (Ptr OSTree.RepoDevInoCache.RepoDevInoCache)
type AttrGetType RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = Maybe OSTree.RepoDevInoCache.RepoDevInoCache
type AttrLabel RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = "devino_to_csum_cache"
type AttrOrigin RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsDevinoToCsumCache
attrSet = setRepoCheckoutAtOptionsDevinoToCsumCache
attrConstruct = undefined
attrClear = clearRepoCheckoutAtOptionsDevinoToCsumCache
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.devinoToCsumCache"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:devinoToCsumCache"
})
repoCheckoutAtOptions_devinoToCsumCache :: AttrLabelProxy "devinoToCsumCache"
repoCheckoutAtOptions_devinoToCsumCache = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsFilter :: MonadIO m => RepoCheckoutAtOptions -> m (Maybe OSTree.Callbacks.RepoCheckoutFilter_WithClosures)
getRepoCheckoutAtOptionsFilter :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m (Maybe RepoCheckoutFilter_WithClosures)
getRepoCheckoutAtOptionsFilter RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
FunPtr C_RepoCheckoutFilter
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
120) :: IO (FunPtr OSTree.Callbacks.C_RepoCheckoutFilter)
Maybe RepoCheckoutFilter_WithClosures
result <- forall a b. FunPtr a -> (FunPtr a -> IO b) -> IO (Maybe b)
SP.convertFunPtrIfNonNull FunPtr C_RepoCheckoutFilter
val forall a b. (a -> b) -> a -> b
$ \FunPtr C_RepoCheckoutFilter
val' -> do
let val'' :: RepoCheckoutFilter_WithClosures
val'' = forall (m :: * -> *) a.
(HasCallStack, MonadIO m, IsRepo a) =>
FunPtr C_RepoCheckoutFilter
-> a -> Text -> Ptr () -> Ptr () -> m RepoCheckoutFilterResult
OSTree.Callbacks.dynamic_RepoCheckoutFilter FunPtr C_RepoCheckoutFilter
val'
forall (m :: * -> *) a. Monad m => a -> m a
return RepoCheckoutFilter_WithClosures
val''
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe RepoCheckoutFilter_WithClosures
result
setRepoCheckoutAtOptionsFilter :: MonadIO m => RepoCheckoutAtOptions -> FunPtr OSTree.Callbacks.C_RepoCheckoutFilter -> m ()
setRepoCheckoutAtOptionsFilter :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> FunPtr C_RepoCheckoutFilter -> m ()
setRepoCheckoutAtOptionsFilter RepoCheckoutAtOptions
s FunPtr C_RepoCheckoutFilter
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
120) (FunPtr C_RepoCheckoutFilter
val :: FunPtr OSTree.Callbacks.C_RepoCheckoutFilter)
clearRepoCheckoutAtOptionsFilter :: MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsFilter :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsFilter RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
120) (forall a. FunPtr a
FP.nullFunPtr :: FunPtr OSTree.Callbacks.C_RepoCheckoutFilter)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsFilterFieldInfo
instance AttrInfo RepoCheckoutAtOptionsFilterFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsFilterFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsFilterFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint RepoCheckoutAtOptionsFilterFieldInfo = (~) (FunPtr OSTree.Callbacks.C_RepoCheckoutFilter)
type AttrTransferTypeConstraint RepoCheckoutAtOptionsFilterFieldInfo = (~)OSTree.Callbacks.RepoCheckoutFilter_WithClosures
type AttrTransferType RepoCheckoutAtOptionsFilterFieldInfo = (FunPtr OSTree.Callbacks.C_RepoCheckoutFilter)
type AttrGetType RepoCheckoutAtOptionsFilterFieldInfo = Maybe OSTree.Callbacks.RepoCheckoutFilter_WithClosures
type AttrLabel RepoCheckoutAtOptionsFilterFieldInfo = "filter"
type AttrOrigin RepoCheckoutAtOptionsFilterFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsFilter
attrSet = setRepoCheckoutAtOptionsFilter
attrConstruct = undefined
attrClear = clearRepoCheckoutAtOptionsFilter
attrTransfer _ v = do
OSTree.Callbacks.mk_RepoCheckoutFilter (OSTree.Callbacks.wrap_RepoCheckoutFilter Nothing v)
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.filter"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:filter"
})
repoCheckoutAtOptions_filter :: AttrLabelProxy "filter"
repoCheckoutAtOptions_filter = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsFilterUserData :: MonadIO m => RepoCheckoutAtOptions -> m (Ptr ())
getRepoCheckoutAtOptionsFilterUserData :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m (Ptr ())
getRepoCheckoutAtOptionsFilterUserData RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
Ptr ()
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
128) :: IO (Ptr ())
forall (m :: * -> *) a. Monad m => a -> m a
return Ptr ()
val
setRepoCheckoutAtOptionsFilterUserData :: MonadIO m => RepoCheckoutAtOptions -> Ptr () -> m ()
setRepoCheckoutAtOptionsFilterUserData :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Ptr () -> m ()
setRepoCheckoutAtOptionsFilterUserData RepoCheckoutAtOptions
s Ptr ()
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
128) (Ptr ()
val :: Ptr ())
clearRepoCheckoutAtOptionsFilterUserData :: MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsFilterUserData :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsFilterUserData RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
128) (forall a. Ptr a
FP.nullPtr :: Ptr ())
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsFilterUserDataFieldInfo
instance AttrInfo RepoCheckoutAtOptionsFilterUserDataFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsFilterUserDataFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsFilterUserDataFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint RepoCheckoutAtOptionsFilterUserDataFieldInfo = (~) (Ptr ())
type AttrTransferTypeConstraint RepoCheckoutAtOptionsFilterUserDataFieldInfo = (~)(Ptr ())
type AttrTransferType RepoCheckoutAtOptionsFilterUserDataFieldInfo = (Ptr ())
type AttrGetType RepoCheckoutAtOptionsFilterUserDataFieldInfo = Ptr ()
type AttrLabel RepoCheckoutAtOptionsFilterUserDataFieldInfo = "filter_user_data"
type AttrOrigin RepoCheckoutAtOptionsFilterUserDataFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsFilterUserData
attrSet = setRepoCheckoutAtOptionsFilterUserData
attrConstruct = undefined
attrClear = clearRepoCheckoutAtOptionsFilterUserData
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.filterUserData"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:filterUserData"
})
repoCheckoutAtOptions_filterUserData :: AttrLabelProxy "filterUserData"
repoCheckoutAtOptions_filterUserData = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsSepolicy :: MonadIO m => RepoCheckoutAtOptions -> m (Maybe OSTree.SePolicy.SePolicy)
getRepoCheckoutAtOptionsSepolicy :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m (Maybe SePolicy)
getRepoCheckoutAtOptionsSepolicy RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
Ptr SePolicy
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
136) :: IO (Ptr OSTree.SePolicy.SePolicy)
Maybe SePolicy
result <- forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
SP.convertIfNonNull Ptr SePolicy
val forall a b. (a -> b) -> a -> b
$ \Ptr SePolicy
val' -> do
SePolicy
val'' <- (forall a b.
(HasCallStack, GObject a, GObject b) =>
(ManagedPtr a -> a) -> Ptr b -> IO a
newObject ManagedPtr SePolicy -> SePolicy
OSTree.SePolicy.SePolicy) Ptr SePolicy
val'
forall (m :: * -> *) a. Monad m => a -> m a
return SePolicy
val''
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe SePolicy
result
setRepoCheckoutAtOptionsSepolicy :: MonadIO m => RepoCheckoutAtOptions -> Ptr OSTree.SePolicy.SePolicy -> m ()
setRepoCheckoutAtOptionsSepolicy :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> Ptr SePolicy -> m ()
setRepoCheckoutAtOptionsSepolicy RepoCheckoutAtOptions
s Ptr SePolicy
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
136) (Ptr SePolicy
val :: Ptr OSTree.SePolicy.SePolicy)
clearRepoCheckoutAtOptionsSepolicy :: MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsSepolicy :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsSepolicy RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
136) (forall a. Ptr a
FP.nullPtr :: Ptr OSTree.SePolicy.SePolicy)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsSepolicyFieldInfo
instance AttrInfo RepoCheckoutAtOptionsSepolicyFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsSepolicyFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsSepolicyFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint RepoCheckoutAtOptionsSepolicyFieldInfo = (~) (Ptr OSTree.SePolicy.SePolicy)
type AttrTransferTypeConstraint RepoCheckoutAtOptionsSepolicyFieldInfo = (~)(Ptr OSTree.SePolicy.SePolicy)
type AttrTransferType RepoCheckoutAtOptionsSepolicyFieldInfo = (Ptr OSTree.SePolicy.SePolicy)
type AttrGetType RepoCheckoutAtOptionsSepolicyFieldInfo = Maybe OSTree.SePolicy.SePolicy
type AttrLabel RepoCheckoutAtOptionsSepolicyFieldInfo = "sepolicy"
type AttrOrigin RepoCheckoutAtOptionsSepolicyFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsSepolicy
attrSet = setRepoCheckoutAtOptionsSepolicy
attrConstruct = undefined
attrClear = clearRepoCheckoutAtOptionsSepolicy
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.sepolicy"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:sepolicy"
})
repoCheckoutAtOptions_sepolicy :: AttrLabelProxy "sepolicy"
repoCheckoutAtOptions_sepolicy = AttrLabelProxy
#endif
getRepoCheckoutAtOptionsSepolicyPrefix :: MonadIO m => RepoCheckoutAtOptions -> m (Maybe T.Text)
getRepoCheckoutAtOptionsSepolicyPrefix :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> m (Maybe Text)
getRepoCheckoutAtOptionsSepolicyPrefix RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
CString
val <- forall a. Storable a => Ptr a -> IO a
peek (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
144) :: IO CString
Maybe Text
result <- forall a b. Ptr a -> (Ptr a -> IO b) -> IO (Maybe b)
SP.convertIfNonNull CString
val forall a b. (a -> b) -> a -> b
$ \CString
val' -> do
Text
val'' <- HasCallStack => CString -> IO Text
cstringToText CString
val'
forall (m :: * -> *) a. Monad m => a -> m a
return Text
val''
forall (m :: * -> *) a. Monad m => a -> m a
return Maybe Text
result
setRepoCheckoutAtOptionsSepolicyPrefix :: MonadIO m => RepoCheckoutAtOptions -> CString -> m ()
setRepoCheckoutAtOptionsSepolicyPrefix :: forall (m :: * -> *).
MonadIO m =>
RepoCheckoutAtOptions -> CString -> m ()
setRepoCheckoutAtOptionsSepolicyPrefix RepoCheckoutAtOptions
s CString
val = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
144) (CString
val :: CString)
clearRepoCheckoutAtOptionsSepolicyPrefix :: MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsSepolicyPrefix :: forall (m :: * -> *). MonadIO m => RepoCheckoutAtOptions -> m ()
clearRepoCheckoutAtOptionsSepolicyPrefix RepoCheckoutAtOptions
s = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ forall a c.
(HasCallStack, ManagedPtrNewtype a) =>
a -> (Ptr a -> IO c) -> IO c
withManagedPtr RepoCheckoutAtOptions
s forall a b. (a -> b) -> a -> b
$ \Ptr RepoCheckoutAtOptions
ptr -> do
forall a. Storable a => Ptr a -> a -> IO ()
poke (Ptr RepoCheckoutAtOptions
ptr forall a b. Ptr a -> Int -> Ptr b
`plusPtr` Int
144) (forall a. Ptr a
FP.nullPtr :: CString)
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsSepolicyPrefixFieldInfo
instance AttrInfo RepoCheckoutAtOptionsSepolicyPrefixFieldInfo where
type AttrBaseTypeConstraint RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = (~) RepoCheckoutAtOptions
type AttrAllowedOps RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = '[ 'AttrSet, 'AttrGet, 'AttrClear]
type AttrSetTypeConstraint RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = (~) CString
type AttrTransferTypeConstraint RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = (~)CString
type AttrTransferType RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = CString
type AttrGetType RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = Maybe T.Text
type AttrLabel RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = "sepolicy_prefix"
type AttrOrigin RepoCheckoutAtOptionsSepolicyPrefixFieldInfo = RepoCheckoutAtOptions
attrGet = getRepoCheckoutAtOptionsSepolicyPrefix
attrSet = setRepoCheckoutAtOptionsSepolicyPrefix
attrConstruct = undefined
attrClear = clearRepoCheckoutAtOptionsSepolicyPrefix
attrTransfer _ v = do
return v
dbgAttrInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.sepolicyPrefix"
, O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#g:attr:sepolicyPrefix"
})
repoCheckoutAtOptions_sepolicyPrefix :: AttrLabelProxy "sepolicyPrefix"
repoCheckoutAtOptions_sepolicyPrefix = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList RepoCheckoutAtOptions
type instance O.AttributeList RepoCheckoutAtOptions = RepoCheckoutAtOptionsAttributeList
type RepoCheckoutAtOptionsAttributeList = ('[ '("mode", RepoCheckoutAtOptionsModeFieldInfo), '("overwriteMode", RepoCheckoutAtOptionsOverwriteModeFieldInfo), '("enableUncompressedCache", RepoCheckoutAtOptionsEnableUncompressedCacheFieldInfo), '("enableFsync", RepoCheckoutAtOptionsEnableFsyncFieldInfo), '("processWhiteouts", RepoCheckoutAtOptionsProcessWhiteoutsFieldInfo), '("noCopyFallback", RepoCheckoutAtOptionsNoCopyFallbackFieldInfo), '("forceCopy", RepoCheckoutAtOptionsForceCopyFieldInfo), '("bareuseronlyDirs", RepoCheckoutAtOptionsBareuseronlyDirsFieldInfo), '("forceCopyZerosized", RepoCheckoutAtOptionsForceCopyZerosizedFieldInfo), '("processPassthroughWhiteouts", RepoCheckoutAtOptionsProcessPassthroughWhiteoutsFieldInfo), '("subpath", RepoCheckoutAtOptionsSubpathFieldInfo), '("devinoToCsumCache", RepoCheckoutAtOptionsDevinoToCsumCacheFieldInfo), '("filter", RepoCheckoutAtOptionsFilterFieldInfo), '("filterUserData", RepoCheckoutAtOptionsFilterUserDataFieldInfo), '("sepolicy", RepoCheckoutAtOptionsSepolicyFieldInfo), '("sepolicyPrefix", RepoCheckoutAtOptionsSepolicyPrefixFieldInfo)] :: [(Symbol, DK.Type)])
#endif
foreign import ccall "ostree_repo_checkout_at_options_set_devino" ostree_repo_checkout_at_options_set_devino ::
Ptr RepoCheckoutAtOptions ->
Ptr OSTree.RepoDevInoCache.RepoDevInoCache ->
IO ()
repoCheckoutAtOptionsSetDevino ::
(B.CallStack.HasCallStack, MonadIO m) =>
RepoCheckoutAtOptions
-> Maybe (OSTree.RepoDevInoCache.RepoDevInoCache)
-> m ()
repoCheckoutAtOptionsSetDevino :: forall (m :: * -> *).
(HasCallStack, MonadIO m) =>
RepoCheckoutAtOptions -> Maybe RepoDevInoCache -> m ()
repoCheckoutAtOptionsSetDevino RepoCheckoutAtOptions
opts Maybe RepoDevInoCache
cache = forall (m :: * -> *) a. MonadIO m => IO a -> m a
liftIO forall a b. (a -> b) -> a -> b
$ do
Ptr RepoCheckoutAtOptions
opts' <- forall a. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr a)
unsafeManagedPtrGetPtr RepoCheckoutAtOptions
opts
Ptr RepoDevInoCache
maybeCache <- case Maybe RepoDevInoCache
cache of
Maybe RepoDevInoCache
Nothing -> forall (m :: * -> *) a. Monad m => a -> m a
return forall a. Ptr a
nullPtr
Just RepoDevInoCache
jCache -> do
Ptr RepoDevInoCache
jCache' <- forall a. (HasCallStack, ManagedPtrNewtype a) => a -> IO (Ptr a)
unsafeManagedPtrGetPtr RepoDevInoCache
jCache
forall (m :: * -> *) a. Monad m => a -> m a
return Ptr RepoDevInoCache
jCache'
Ptr RepoCheckoutAtOptions -> Ptr RepoDevInoCache -> IO ()
ostree_repo_checkout_at_options_set_devino Ptr RepoCheckoutAtOptions
opts' Ptr RepoDevInoCache
maybeCache
forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr RepoCheckoutAtOptions
opts
forall (m :: * -> *) a. Monad m => Maybe a -> (a -> m ()) -> m ()
whenJust Maybe RepoDevInoCache
cache forall a. ManagedPtrNewtype a => a -> IO ()
touchManagedPtr
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#if defined(ENABLE_OVERLOADING)
data RepoCheckoutAtOptionsSetDevinoMethodInfo
instance (signature ~ (Maybe (OSTree.RepoDevInoCache.RepoDevInoCache) -> m ()), MonadIO m) => O.OverloadedMethod RepoCheckoutAtOptionsSetDevinoMethodInfo RepoCheckoutAtOptions signature where
overloadedMethod = repoCheckoutAtOptionsSetDevino
instance O.OverloadedMethodInfo RepoCheckoutAtOptionsSetDevinoMethodInfo RepoCheckoutAtOptions where
overloadedMethodInfo = P.Just (O.ResolvedSymbolInfo {
O.resolvedSymbolName = "GI.OSTree.Structs.RepoCheckoutAtOptions.repoCheckoutAtOptionsSetDevino",
O.resolvedSymbolURL = "https://hackage.haskell.org/package/gi-ostree-1.0.16/docs/GI-OSTree-Structs-RepoCheckoutAtOptions.html#v:repoCheckoutAtOptionsSetDevino"
})
#endif
#if defined(ENABLE_OVERLOADING)
type family ResolveRepoCheckoutAtOptionsMethod (t :: Symbol) (o :: DK.Type) :: DK.Type where
ResolveRepoCheckoutAtOptionsMethod "setDevino" o = RepoCheckoutAtOptionsSetDevinoMethodInfo
ResolveRepoCheckoutAtOptionsMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveRepoCheckoutAtOptionsMethod t RepoCheckoutAtOptions, O.OverloadedMethod info RepoCheckoutAtOptions p) => OL.IsLabel t (RepoCheckoutAtOptions -> 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 ~ ResolveRepoCheckoutAtOptionsMethod t RepoCheckoutAtOptions, O.OverloadedMethod info RepoCheckoutAtOptions p, R.HasField t RepoCheckoutAtOptions p) => R.HasField t RepoCheckoutAtOptions p where
getField = O.overloadedMethod @info
#endif
instance (info ~ ResolveRepoCheckoutAtOptionsMethod t RepoCheckoutAtOptions, O.OverloadedMethodInfo info RepoCheckoutAtOptions) => OL.IsLabel t (O.MethodProxy info RepoCheckoutAtOptions) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.MethodProxy
#else
fromLabel _ = O.MethodProxy
#endif
#endif