{-# LANGUAGE TypeApplications #-}
#if (MIN_VERSION_haskell_gi_overloading(1,0,0) && !defined(__HADDOCK_VERSION__))
#define ENABLE_OVERLOADING
#endif
module GI.Pango.Structs.LogAttr
(
LogAttr(..) ,
newZeroLogAttr ,
noLogAttr ,
#if defined(ENABLE_OVERLOADING)
ResolveLogAttrMethod ,
#endif
getLogAttrBackspaceDeletesCharacter ,
#if defined(ENABLE_OVERLOADING)
logAttr_backspaceDeletesCharacter ,
#endif
setLogAttrBackspaceDeletesCharacter ,
getLogAttrIsCharBreak ,
#if defined(ENABLE_OVERLOADING)
logAttr_isCharBreak ,
#endif
setLogAttrIsCharBreak ,
getLogAttrIsCursorPosition ,
#if defined(ENABLE_OVERLOADING)
logAttr_isCursorPosition ,
#endif
setLogAttrIsCursorPosition ,
getLogAttrIsExpandableSpace ,
#if defined(ENABLE_OVERLOADING)
logAttr_isExpandableSpace ,
#endif
setLogAttrIsExpandableSpace ,
getLogAttrIsLineBreak ,
#if defined(ENABLE_OVERLOADING)
logAttr_isLineBreak ,
#endif
setLogAttrIsLineBreak ,
getLogAttrIsMandatoryBreak ,
#if defined(ENABLE_OVERLOADING)
logAttr_isMandatoryBreak ,
#endif
setLogAttrIsMandatoryBreak ,
getLogAttrIsSentenceBoundary ,
#if defined(ENABLE_OVERLOADING)
logAttr_isSentenceBoundary ,
#endif
setLogAttrIsSentenceBoundary ,
getLogAttrIsSentenceEnd ,
#if defined(ENABLE_OVERLOADING)
logAttr_isSentenceEnd ,
#endif
setLogAttrIsSentenceEnd ,
getLogAttrIsSentenceStart ,
#if defined(ENABLE_OVERLOADING)
logAttr_isSentenceStart ,
#endif
setLogAttrIsSentenceStart ,
getLogAttrIsWhite ,
#if defined(ENABLE_OVERLOADING)
logAttr_isWhite ,
#endif
setLogAttrIsWhite ,
getLogAttrIsWordBoundary ,
#if defined(ENABLE_OVERLOADING)
logAttr_isWordBoundary ,
#endif
setLogAttrIsWordBoundary ,
getLogAttrIsWordEnd ,
#if defined(ENABLE_OVERLOADING)
logAttr_isWordEnd ,
#endif
setLogAttrIsWordEnd ,
getLogAttrIsWordStart ,
#if defined(ENABLE_OVERLOADING)
logAttr_isWordStart ,
#endif
setLogAttrIsWordStart ,
) 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.ManagedPtr as B.ManagedPtr
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 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
newtype LogAttr = LogAttr (ManagedPtr LogAttr)
deriving (Eq)
instance WrappedPtr LogAttr where
wrappedPtrCalloc = callocBytes 52
wrappedPtrCopy = \p -> withManagedPtr p (copyBytes 52 >=> wrapPtr LogAttr)
wrappedPtrFree = Just ptr_to_g_free
newZeroLogAttr :: MonadIO m => m LogAttr
newZeroLogAttr = liftIO $ wrappedPtrCalloc >>= wrapPtr LogAttr
instance tag ~ 'AttrSet => Constructible LogAttr tag where
new _ attrs = do
o <- newZeroLogAttr
GI.Attributes.set o attrs
return o
noLogAttr :: Maybe LogAttr
noLogAttr = Nothing
getLogAttrIsLineBreak :: MonadIO m => LogAttr -> m Word32
getLogAttrIsLineBreak s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 0) :: IO Word32
return val
setLogAttrIsLineBreak :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsLineBreak s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 0) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsLineBreakFieldInfo
instance AttrInfo LogAttrIsLineBreakFieldInfo where
type AttrBaseTypeConstraint LogAttrIsLineBreakFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsLineBreakFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsLineBreakFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsLineBreakFieldInfo = (~)Word32
type AttrTransferType LogAttrIsLineBreakFieldInfo = Word32
type AttrGetType LogAttrIsLineBreakFieldInfo = Word32
type AttrLabel LogAttrIsLineBreakFieldInfo = "is_line_break"
type AttrOrigin LogAttrIsLineBreakFieldInfo = LogAttr
attrGet = getLogAttrIsLineBreak
attrSet = setLogAttrIsLineBreak
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isLineBreak :: AttrLabelProxy "isLineBreak"
logAttr_isLineBreak = AttrLabelProxy
#endif
getLogAttrIsMandatoryBreak :: MonadIO m => LogAttr -> m Word32
getLogAttrIsMandatoryBreak s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 4) :: IO Word32
return val
setLogAttrIsMandatoryBreak :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsMandatoryBreak s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 4) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsMandatoryBreakFieldInfo
instance AttrInfo LogAttrIsMandatoryBreakFieldInfo where
type AttrBaseTypeConstraint LogAttrIsMandatoryBreakFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsMandatoryBreakFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsMandatoryBreakFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsMandatoryBreakFieldInfo = (~)Word32
type AttrTransferType LogAttrIsMandatoryBreakFieldInfo = Word32
type AttrGetType LogAttrIsMandatoryBreakFieldInfo = Word32
type AttrLabel LogAttrIsMandatoryBreakFieldInfo = "is_mandatory_break"
type AttrOrigin LogAttrIsMandatoryBreakFieldInfo = LogAttr
attrGet = getLogAttrIsMandatoryBreak
attrSet = setLogAttrIsMandatoryBreak
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isMandatoryBreak :: AttrLabelProxy "isMandatoryBreak"
logAttr_isMandatoryBreak = AttrLabelProxy
#endif
getLogAttrIsCharBreak :: MonadIO m => LogAttr -> m Word32
getLogAttrIsCharBreak s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 8) :: IO Word32
return val
setLogAttrIsCharBreak :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsCharBreak s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 8) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsCharBreakFieldInfo
instance AttrInfo LogAttrIsCharBreakFieldInfo where
type AttrBaseTypeConstraint LogAttrIsCharBreakFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsCharBreakFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsCharBreakFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsCharBreakFieldInfo = (~)Word32
type AttrTransferType LogAttrIsCharBreakFieldInfo = Word32
type AttrGetType LogAttrIsCharBreakFieldInfo = Word32
type AttrLabel LogAttrIsCharBreakFieldInfo = "is_char_break"
type AttrOrigin LogAttrIsCharBreakFieldInfo = LogAttr
attrGet = getLogAttrIsCharBreak
attrSet = setLogAttrIsCharBreak
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isCharBreak :: AttrLabelProxy "isCharBreak"
logAttr_isCharBreak = AttrLabelProxy
#endif
getLogAttrIsWhite :: MonadIO m => LogAttr -> m Word32
getLogAttrIsWhite s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 12) :: IO Word32
return val
setLogAttrIsWhite :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsWhite s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 12) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsWhiteFieldInfo
instance AttrInfo LogAttrIsWhiteFieldInfo where
type AttrBaseTypeConstraint LogAttrIsWhiteFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsWhiteFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsWhiteFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsWhiteFieldInfo = (~)Word32
type AttrTransferType LogAttrIsWhiteFieldInfo = Word32
type AttrGetType LogAttrIsWhiteFieldInfo = Word32
type AttrLabel LogAttrIsWhiteFieldInfo = "is_white"
type AttrOrigin LogAttrIsWhiteFieldInfo = LogAttr
attrGet = getLogAttrIsWhite
attrSet = setLogAttrIsWhite
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isWhite :: AttrLabelProxy "isWhite"
logAttr_isWhite = AttrLabelProxy
#endif
getLogAttrIsCursorPosition :: MonadIO m => LogAttr -> m Word32
getLogAttrIsCursorPosition s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 16) :: IO Word32
return val
setLogAttrIsCursorPosition :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsCursorPosition s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 16) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsCursorPositionFieldInfo
instance AttrInfo LogAttrIsCursorPositionFieldInfo where
type AttrBaseTypeConstraint LogAttrIsCursorPositionFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsCursorPositionFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsCursorPositionFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsCursorPositionFieldInfo = (~)Word32
type AttrTransferType LogAttrIsCursorPositionFieldInfo = Word32
type AttrGetType LogAttrIsCursorPositionFieldInfo = Word32
type AttrLabel LogAttrIsCursorPositionFieldInfo = "is_cursor_position"
type AttrOrigin LogAttrIsCursorPositionFieldInfo = LogAttr
attrGet = getLogAttrIsCursorPosition
attrSet = setLogAttrIsCursorPosition
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isCursorPosition :: AttrLabelProxy "isCursorPosition"
logAttr_isCursorPosition = AttrLabelProxy
#endif
getLogAttrIsWordStart :: MonadIO m => LogAttr -> m Word32
getLogAttrIsWordStart s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 20) :: IO Word32
return val
setLogAttrIsWordStart :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsWordStart s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 20) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsWordStartFieldInfo
instance AttrInfo LogAttrIsWordStartFieldInfo where
type AttrBaseTypeConstraint LogAttrIsWordStartFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsWordStartFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsWordStartFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsWordStartFieldInfo = (~)Word32
type AttrTransferType LogAttrIsWordStartFieldInfo = Word32
type AttrGetType LogAttrIsWordStartFieldInfo = Word32
type AttrLabel LogAttrIsWordStartFieldInfo = "is_word_start"
type AttrOrigin LogAttrIsWordStartFieldInfo = LogAttr
attrGet = getLogAttrIsWordStart
attrSet = setLogAttrIsWordStart
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isWordStart :: AttrLabelProxy "isWordStart"
logAttr_isWordStart = AttrLabelProxy
#endif
getLogAttrIsWordEnd :: MonadIO m => LogAttr -> m Word32
getLogAttrIsWordEnd s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 24) :: IO Word32
return val
setLogAttrIsWordEnd :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsWordEnd s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 24) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsWordEndFieldInfo
instance AttrInfo LogAttrIsWordEndFieldInfo where
type AttrBaseTypeConstraint LogAttrIsWordEndFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsWordEndFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsWordEndFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsWordEndFieldInfo = (~)Word32
type AttrTransferType LogAttrIsWordEndFieldInfo = Word32
type AttrGetType LogAttrIsWordEndFieldInfo = Word32
type AttrLabel LogAttrIsWordEndFieldInfo = "is_word_end"
type AttrOrigin LogAttrIsWordEndFieldInfo = LogAttr
attrGet = getLogAttrIsWordEnd
attrSet = setLogAttrIsWordEnd
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isWordEnd :: AttrLabelProxy "isWordEnd"
logAttr_isWordEnd = AttrLabelProxy
#endif
getLogAttrIsSentenceBoundary :: MonadIO m => LogAttr -> m Word32
getLogAttrIsSentenceBoundary s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 28) :: IO Word32
return val
setLogAttrIsSentenceBoundary :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsSentenceBoundary s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 28) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsSentenceBoundaryFieldInfo
instance AttrInfo LogAttrIsSentenceBoundaryFieldInfo where
type AttrBaseTypeConstraint LogAttrIsSentenceBoundaryFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsSentenceBoundaryFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsSentenceBoundaryFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsSentenceBoundaryFieldInfo = (~)Word32
type AttrTransferType LogAttrIsSentenceBoundaryFieldInfo = Word32
type AttrGetType LogAttrIsSentenceBoundaryFieldInfo = Word32
type AttrLabel LogAttrIsSentenceBoundaryFieldInfo = "is_sentence_boundary"
type AttrOrigin LogAttrIsSentenceBoundaryFieldInfo = LogAttr
attrGet = getLogAttrIsSentenceBoundary
attrSet = setLogAttrIsSentenceBoundary
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isSentenceBoundary :: AttrLabelProxy "isSentenceBoundary"
logAttr_isSentenceBoundary = AttrLabelProxy
#endif
getLogAttrIsSentenceStart :: MonadIO m => LogAttr -> m Word32
getLogAttrIsSentenceStart s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 32) :: IO Word32
return val
setLogAttrIsSentenceStart :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsSentenceStart s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 32) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsSentenceStartFieldInfo
instance AttrInfo LogAttrIsSentenceStartFieldInfo where
type AttrBaseTypeConstraint LogAttrIsSentenceStartFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsSentenceStartFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsSentenceStartFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsSentenceStartFieldInfo = (~)Word32
type AttrTransferType LogAttrIsSentenceStartFieldInfo = Word32
type AttrGetType LogAttrIsSentenceStartFieldInfo = Word32
type AttrLabel LogAttrIsSentenceStartFieldInfo = "is_sentence_start"
type AttrOrigin LogAttrIsSentenceStartFieldInfo = LogAttr
attrGet = getLogAttrIsSentenceStart
attrSet = setLogAttrIsSentenceStart
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isSentenceStart :: AttrLabelProxy "isSentenceStart"
logAttr_isSentenceStart = AttrLabelProxy
#endif
getLogAttrIsSentenceEnd :: MonadIO m => LogAttr -> m Word32
getLogAttrIsSentenceEnd s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 36) :: IO Word32
return val
setLogAttrIsSentenceEnd :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsSentenceEnd s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 36) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsSentenceEndFieldInfo
instance AttrInfo LogAttrIsSentenceEndFieldInfo where
type AttrBaseTypeConstraint LogAttrIsSentenceEndFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsSentenceEndFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsSentenceEndFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsSentenceEndFieldInfo = (~)Word32
type AttrTransferType LogAttrIsSentenceEndFieldInfo = Word32
type AttrGetType LogAttrIsSentenceEndFieldInfo = Word32
type AttrLabel LogAttrIsSentenceEndFieldInfo = "is_sentence_end"
type AttrOrigin LogAttrIsSentenceEndFieldInfo = LogAttr
attrGet = getLogAttrIsSentenceEnd
attrSet = setLogAttrIsSentenceEnd
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isSentenceEnd :: AttrLabelProxy "isSentenceEnd"
logAttr_isSentenceEnd = AttrLabelProxy
#endif
getLogAttrBackspaceDeletesCharacter :: MonadIO m => LogAttr -> m Word32
getLogAttrBackspaceDeletesCharacter s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 40) :: IO Word32
return val
setLogAttrBackspaceDeletesCharacter :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrBackspaceDeletesCharacter s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 40) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrBackspaceDeletesCharacterFieldInfo
instance AttrInfo LogAttrBackspaceDeletesCharacterFieldInfo where
type AttrBaseTypeConstraint LogAttrBackspaceDeletesCharacterFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrBackspaceDeletesCharacterFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrBackspaceDeletesCharacterFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrBackspaceDeletesCharacterFieldInfo = (~)Word32
type AttrTransferType LogAttrBackspaceDeletesCharacterFieldInfo = Word32
type AttrGetType LogAttrBackspaceDeletesCharacterFieldInfo = Word32
type AttrLabel LogAttrBackspaceDeletesCharacterFieldInfo = "backspace_deletes_character"
type AttrOrigin LogAttrBackspaceDeletesCharacterFieldInfo = LogAttr
attrGet = getLogAttrBackspaceDeletesCharacter
attrSet = setLogAttrBackspaceDeletesCharacter
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_backspaceDeletesCharacter :: AttrLabelProxy "backspaceDeletesCharacter"
logAttr_backspaceDeletesCharacter = AttrLabelProxy
#endif
getLogAttrIsExpandableSpace :: MonadIO m => LogAttr -> m Word32
getLogAttrIsExpandableSpace s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 44) :: IO Word32
return val
setLogAttrIsExpandableSpace :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsExpandableSpace s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 44) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsExpandableSpaceFieldInfo
instance AttrInfo LogAttrIsExpandableSpaceFieldInfo where
type AttrBaseTypeConstraint LogAttrIsExpandableSpaceFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsExpandableSpaceFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsExpandableSpaceFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsExpandableSpaceFieldInfo = (~)Word32
type AttrTransferType LogAttrIsExpandableSpaceFieldInfo = Word32
type AttrGetType LogAttrIsExpandableSpaceFieldInfo = Word32
type AttrLabel LogAttrIsExpandableSpaceFieldInfo = "is_expandable_space"
type AttrOrigin LogAttrIsExpandableSpaceFieldInfo = LogAttr
attrGet = getLogAttrIsExpandableSpace
attrSet = setLogAttrIsExpandableSpace
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isExpandableSpace :: AttrLabelProxy "isExpandableSpace"
logAttr_isExpandableSpace = AttrLabelProxy
#endif
getLogAttrIsWordBoundary :: MonadIO m => LogAttr -> m Word32
getLogAttrIsWordBoundary s = liftIO $ withManagedPtr s $ \ptr -> do
val <- peek (ptr `plusPtr` 48) :: IO Word32
return val
setLogAttrIsWordBoundary :: MonadIO m => LogAttr -> Word32 -> m ()
setLogAttrIsWordBoundary s val = liftIO $ withManagedPtr s $ \ptr -> do
poke (ptr `plusPtr` 48) (val :: Word32)
#if defined(ENABLE_OVERLOADING)
data LogAttrIsWordBoundaryFieldInfo
instance AttrInfo LogAttrIsWordBoundaryFieldInfo where
type AttrBaseTypeConstraint LogAttrIsWordBoundaryFieldInfo = (~) LogAttr
type AttrAllowedOps LogAttrIsWordBoundaryFieldInfo = '[ 'AttrSet, 'AttrGet]
type AttrSetTypeConstraint LogAttrIsWordBoundaryFieldInfo = (~) Word32
type AttrTransferTypeConstraint LogAttrIsWordBoundaryFieldInfo = (~)Word32
type AttrTransferType LogAttrIsWordBoundaryFieldInfo = Word32
type AttrGetType LogAttrIsWordBoundaryFieldInfo = Word32
type AttrLabel LogAttrIsWordBoundaryFieldInfo = "is_word_boundary"
type AttrOrigin LogAttrIsWordBoundaryFieldInfo = LogAttr
attrGet = getLogAttrIsWordBoundary
attrSet = setLogAttrIsWordBoundary
attrConstruct = undefined
attrClear = undefined
attrTransfer _ v = do
return v
logAttr_isWordBoundary :: AttrLabelProxy "isWordBoundary"
logAttr_isWordBoundary = AttrLabelProxy
#endif
#if defined(ENABLE_OVERLOADING)
instance O.HasAttributeList LogAttr
type instance O.AttributeList LogAttr = LogAttrAttributeList
type LogAttrAttributeList = ('[ '("isLineBreak", LogAttrIsLineBreakFieldInfo), '("isMandatoryBreak", LogAttrIsMandatoryBreakFieldInfo), '("isCharBreak", LogAttrIsCharBreakFieldInfo), '("isWhite", LogAttrIsWhiteFieldInfo), '("isCursorPosition", LogAttrIsCursorPositionFieldInfo), '("isWordStart", LogAttrIsWordStartFieldInfo), '("isWordEnd", LogAttrIsWordEndFieldInfo), '("isSentenceBoundary", LogAttrIsSentenceBoundaryFieldInfo), '("isSentenceStart", LogAttrIsSentenceStartFieldInfo), '("isSentenceEnd", LogAttrIsSentenceEndFieldInfo), '("backspaceDeletesCharacter", LogAttrBackspaceDeletesCharacterFieldInfo), '("isExpandableSpace", LogAttrIsExpandableSpaceFieldInfo), '("isWordBoundary", LogAttrIsWordBoundaryFieldInfo)] :: [(Symbol, *)])
#endif
#if defined(ENABLE_OVERLOADING)
type family ResolveLogAttrMethod (t :: Symbol) (o :: *) :: * where
ResolveLogAttrMethod l o = O.MethodResolutionFailed l o
instance (info ~ ResolveLogAttrMethod t LogAttr, O.MethodInfo info LogAttr p) => OL.IsLabel t (LogAttr -> p) where
#if MIN_VERSION_base(4,10,0)
fromLabel = O.overloadedMethod @info
#else
fromLabel _ = O.overloadedMethod @info
#endif
#endif