| Safe Haskell | None |
|---|---|
| Language | GHC2021 |
KB.Text.Shape.FFI.Structs
Documentation
Constructors
| FontInfo | |
Fields
| |
Instances
| Storable FontInfo Source # | |
Defined in KB.Text.Shape.FFI.Structs | |
| Show FontInfo Source # | |
| Eq FontInfo Source # | |
data GlyphIterator Source #
Constructors
| GlyphIterator | |
Fields
| |
Instances
| Storable GlyphIterator Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods sizeOf :: GlyphIterator -> Int # alignment :: GlyphIterator -> Int # peekElemOff :: Ptr GlyphIterator -> Int -> IO GlyphIterator # pokeElemOff :: Ptr GlyphIterator -> Int -> GlyphIterator -> IO () # peekByteOff :: Ptr b -> Int -> IO GlyphIterator # pokeByteOff :: Ptr b -> Int -> GlyphIterator -> IO () # peek :: Ptr GlyphIterator -> IO GlyphIterator # poke :: Ptr GlyphIterator -> GlyphIterator -> IO () # | |
| Show GlyphIterator Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods showsPrec :: Int -> GlyphIterator -> ShowS # show :: GlyphIterator -> String # showList :: [GlyphIterator] -> ShowS # | |
data CodepointIterator Source #
Constructors
| CodepointIterator | |
Fields | |
Instances
| Storable CodepointIterator Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods sizeOf :: CodepointIterator -> Int # alignment :: CodepointIterator -> Int # peekElemOff :: Ptr CodepointIterator -> Int -> IO CodepointIterator # pokeElemOff :: Ptr CodepointIterator -> Int -> CodepointIterator -> IO () # peekByteOff :: Ptr b -> Int -> IO CodepointIterator # pokeByteOff :: Ptr b -> Int -> CodepointIterator -> IO () # peek :: Ptr CodepointIterator -> IO CodepointIterator # poke :: Ptr CodepointIterator -> CodepointIterator -> IO () # | |
| Show CodepointIterator Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods showsPrec :: Int -> CodepointIterator -> ShowS # show :: CodepointIterator -> String # showList :: [CodepointIterator] -> ShowS # | |
Constructors
| Run | |
Fields
| |
runGlyphIterator :: Ptr Run -> Ptr GlyphIterator Source #
Constructors
| Arena | |
Fields
| |
Instances
| Storable Arena Source # | |
| Show Arena Source # | |
data ArenaBlockHeader Source #
Constructors
| ArenaBlockHeader | |
Fields | |
Instances
| Storable ArenaBlockHeader Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods sizeOf :: ArenaBlockHeader -> Int # alignment :: ArenaBlockHeader -> Int # peekElemOff :: Ptr ArenaBlockHeader -> Int -> IO ArenaBlockHeader # pokeElemOff :: Ptr ArenaBlockHeader -> Int -> ArenaBlockHeader -> IO () # peekByteOff :: Ptr b -> Int -> IO ArenaBlockHeader # pokeByteOff :: Ptr b -> Int -> ArenaBlockHeader -> IO () # peek :: Ptr ArenaBlockHeader -> IO ArenaBlockHeader # poke :: Ptr ArenaBlockHeader -> ArenaBlockHeader -> IO () # | |
| Show ArenaBlockHeader Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods showsPrec :: Int -> ArenaBlockHeader -> ShowS # show :: ArenaBlockHeader -> String # showList :: [ArenaBlockHeader] -> ShowS # | |
data GlyphStorage Source #
Constructors
| GlyphStorage | |
Fields
| |
Instances
| Storable GlyphStorage Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods sizeOf :: GlyphStorage -> Int # alignment :: GlyphStorage -> Int # peekElemOff :: Ptr GlyphStorage -> Int -> IO GlyphStorage # pokeElemOff :: Ptr GlyphStorage -> Int -> GlyphStorage -> IO () # peekByteOff :: Ptr b -> Int -> IO GlyphStorage # pokeByteOff :: Ptr b -> Int -> GlyphStorage -> IO () # peek :: Ptr GlyphStorage -> IO GlyphStorage # poke :: Ptr GlyphStorage -> GlyphStorage -> IO () # | |
| Show GlyphStorage Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods showsPrec :: Int -> GlyphStorage -> ShowS # show :: GlyphStorage -> String # showList :: [GlyphStorage] -> ShowS # | |
Constructors
| Glyph | |
Fields
| |
Instances
| Storable Glyph Source # | |
| Show Glyph Source # | |
Constructors
| Codepoint | |
Fields
| |
Instances
| Storable Codepoint Source # | |
Defined in KB.Text.Shape.FFI.Structs | |
| Show Codepoint Source # | |
data FeatureOverride Source #
Constructors
| FeatureOverride | |
Fields
| |
Instances
data GlyphParent Source #
Constructors
| GlyphParent | |
Fields
| |
Instances
pattern MAXIMUM_RECOMPOSITION_PARENTS :: Int Source #
data FontCoverageTest Source #
Constructors
| FontCoverageTest | |
Fields
| |
Instances
| Storable FontCoverageTest Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods sizeOf :: FontCoverageTest -> Int # alignment :: FontCoverageTest -> Int # peekElemOff :: Ptr FontCoverageTest -> Int -> IO FontCoverageTest # pokeElemOff :: Ptr FontCoverageTest -> Int -> FontCoverageTest -> IO () # peekByteOff :: Ptr b -> Int -> IO FontCoverageTest # pokeByteOff :: Ptr b -> Int -> FontCoverageTest -> IO () # peek :: Ptr FontCoverageTest -> IO FontCoverageTest # poke :: Ptr FontCoverageTest -> FontCoverageTest -> IO () # | |
| Show FontCoverageTest Source # | |
Defined in KB.Text.Shape.FFI.Structs Methods showsPrec :: Int -> FontCoverageTest -> ShowS # show :: FontCoverageTest -> String # showList :: [FontCoverageTest] -> ShowS # | |
Constructors
| Break | |
Fields
| |
Instances
| Storable Break Source # | |
| Show Break Source # | |
| Eq Break Source # | |