Safe Haskell | None |
---|---|
Language | Haskell2010 |
Bindings to rtext
Synopsis
- getFontDefault :: IO Font
- loadFont :: String -> IO Font
- loadFontEx :: String -> Int -> Maybe [Int] -> IO Font
- loadFontFromImage :: Image -> Color -> Int -> IO Font
- loadFontFromMemory :: String -> [Integer] -> Int -> Maybe [Int] -> IO Font
- loadFontData :: [Integer] -> Int -> Maybe [Int] -> FontType -> IO GlyphInfo
- genImageFontAtlas :: [GlyphInfo] -> [[Rectangle]] -> Int -> Int -> Int -> Int -> IO Image
- unloadFont :: Font -> WindowResources -> IO ()
- isFontReady :: Font -> IO Bool
- exportFontAsCode :: Font -> String -> IO Bool
- drawFPS :: Int -> Int -> IO ()
- drawText :: String -> Int -> Int -> Int -> Color -> IO ()
- drawTextEx :: Font -> String -> Vector2 -> Float -> Float -> Color -> IO ()
- drawTextPro :: Font -> String -> Vector2 -> Vector2 -> Float -> Float -> Float -> Color -> IO ()
- drawTextCodepoint :: Font -> Int -> Vector2 -> Float -> Color -> IO ()
- drawTextCodepoints :: Font -> [Int] -> Vector2 -> Float -> Float -> Color -> IO ()
- setTextLineSpacing :: Int -> IO ()
- measureText :: String -> Int -> IO Int
- measureTextEx :: Font -> String -> Float -> Float -> IO Vector2
- getGlyphIndex :: Font -> Int -> IO Int
- getGlyphInfo :: Font -> Int -> IO GlyphInfo
- getGlyphAtlasRec :: Font -> Int -> IO Rectangle
- loadUTF8 :: [Integer] -> IO String
- loadCodepoints :: String -> IO [Int]
- getCodepointCount :: String -> IO Int
- getCodepointNext :: String -> IO (Int, Int)
- getCodepointPrevious :: String -> IO (Int, Int)
- codepointToUTF8 :: Int -> IO String
- c'getFontDefault :: IO (Ptr Font)
- c'loadFont :: CString -> IO (Ptr Font)
- c'loadFontEx :: CString -> CInt -> Ptr CInt -> CInt -> IO (Ptr Font)
- c'loadFontFromImage :: Ptr Image -> Ptr Color -> CInt -> IO (Ptr Font)
- c'loadFontFromMemory :: CString -> Ptr CUChar -> CInt -> CInt -> Ptr CInt -> CInt -> IO (Ptr Font)
- c'loadFontData :: Ptr CUChar -> CInt -> CInt -> Ptr CInt -> CInt -> CInt -> IO (Ptr GlyphInfo)
- c'genImageFontAtlas :: Ptr GlyphInfo -> Ptr (Ptr Rectangle) -> CInt -> CInt -> CInt -> CInt -> IO (Ptr Image)
- c'unloadFontData :: Ptr GlyphInfo -> CInt -> IO ()
- c'isFontReady :: Ptr Font -> IO CBool
- c'unloadFont :: Ptr Font -> IO ()
- c'exportFontAsCode :: Ptr Font -> CString -> IO CBool
- c'drawFPS :: CInt -> CInt -> IO ()
- c'drawText :: CString -> CInt -> CInt -> CInt -> Ptr Color -> IO ()
- c'drawTextEx :: Ptr Font -> CString -> Ptr Vector2 -> CFloat -> CFloat -> Ptr Color -> IO ()
- c'drawTextPro :: Ptr Font -> CString -> Ptr Vector2 -> Ptr Vector2 -> CFloat -> CFloat -> CFloat -> Ptr Color -> IO ()
- c'drawTextCodepoint :: Ptr Font -> CInt -> Ptr Vector2 -> CFloat -> Ptr Color -> IO ()
- c'drawTextCodepoints :: Ptr Font -> Ptr CInt -> CInt -> Ptr Vector2 -> CFloat -> CFloat -> Ptr Color -> IO ()
- c'setTextLineSpacing :: CInt -> IO ()
- c'measureText :: CString -> CInt -> IO CInt
- c'measureTextEx :: Ptr Font -> CString -> CFloat -> CFloat -> IO (Ptr Vector2)
- c'getGlyphIndex :: Ptr Font -> CInt -> IO CInt
- c'getGlyphInfo :: Ptr Font -> CInt -> IO (Ptr GlyphInfo)
- c'getGlyphAtlasRec :: Ptr Font -> CInt -> IO (Ptr Rectangle)
- c'loadUTF8 :: Ptr CInt -> CInt -> IO CString
- c'loadCodepoints :: CString -> Ptr CInt -> IO (Ptr CInt)
- c'getCodepointCount :: CString -> IO CInt
- c'getCodepointNext :: CString -> Ptr CInt -> IO CInt
- c'getCodepointPrevious :: CString -> Ptr CInt -> IO CInt
- c'codepointToUTF8 :: CInt -> Ptr CInt -> IO CString
High level
getFontDefault :: IO Font Source #
unloadFont :: Font -> WindowResources -> IO () Source #
Unloads a managed
font from GPU memory (VRAM)
isFontReady :: Font -> IO Bool Source #
exportFontAsCode :: Font -> String -> IO Bool Source #
drawTextPro :: Font -> String -> Vector2 -> Vector2 -> Float -> Float -> Float -> Color -> IO () Source #
setTextLineSpacing :: Int -> IO () Source #
measureText :: String -> Int -> IO Int Source #
measureTextEx :: Font -> String -> Float -> Float -> IO Vector2 Source #
loadCodepoints :: String -> IO [Int] Source #
getCodepointCount :: String -> IO Int Source #
getCodepointNext :: String -> IO (Int, Int) Source #
getCodepointPrevious :: String -> IO (Int, Int) Source #
codepointToUTF8 :: Int -> IO String Source #
Native
c'getFontDefault :: IO (Ptr Font) Source #
c'loadFont :: CString -> IO (Ptr Font) Source #
c'loadFontFromMemory :: CString -> Ptr CUChar -> CInt -> CInt -> Ptr CInt -> CInt -> IO (Ptr Font) Source #
c'loadFontData :: Ptr CUChar -> CInt -> CInt -> Ptr CInt -> CInt -> CInt -> IO (Ptr GlyphInfo) Source #
c'genImageFontAtlas :: Ptr GlyphInfo -> Ptr (Ptr Rectangle) -> CInt -> CInt -> CInt -> CInt -> IO (Ptr Image) Source #
c'unloadFontData :: Ptr GlyphInfo -> CInt -> IO () Source #
c'isFontReady :: Ptr Font -> IO CBool Source #
c'unloadFont :: Ptr Font -> IO () Source #
c'exportFontAsCode :: Ptr Font -> CString -> IO CBool Source #
c'drawText :: CString -> CInt -> CInt -> CInt -> Ptr Color -> IO () Source #
c'drawTextEx :: Ptr Font -> CString -> Ptr Vector2 -> CFloat -> CFloat -> Ptr Color -> IO () Source #
c'drawTextPro :: Ptr Font -> CString -> Ptr Vector2 -> Ptr Vector2 -> CFloat -> CFloat -> CFloat -> Ptr Color -> IO () Source #
c'drawTextCodepoints :: Ptr Font -> Ptr CInt -> CInt -> Ptr Vector2 -> CFloat -> CFloat -> Ptr Color -> IO () Source #
c'setTextLineSpacing :: CInt -> IO () Source #
c'measureText :: CString -> CInt -> IO CInt Source #
c'getGlyphIndex :: Ptr Font -> CInt -> IO CInt Source #
c'loadUTF8 :: Ptr CInt -> CInt -> IO CString Source #
c'loadCodepoints :: CString -> Ptr CInt -> IO (Ptr CInt) Source #
c'getCodepointCount :: CString -> IO CInt Source #
c'getCodepointNext :: CString -> Ptr CInt -> IO CInt Source #
c'getCodepointPrevious :: CString -> Ptr CInt -> IO CInt Source #
c'codepointToUTF8 :: CInt -> Ptr CInt -> IO CString Source #