h-raylib-4.5.0.3: Raylib bindings for Haskell
Safe HaskellSafe-Inferred
LanguageHaskell2010

Raylib

Synopsis

Documentation

initWindow :: Int -> Int -> String -> IO () Source #

beginScissorMode :: Int -> Int -> Int -> Int -> IO () Source #

setShaderValue :: Shader -> Int -> Ptr () -> Int -> IO () Source #

setShaderValueV :: Shader -> Int -> Ptr () -> Int -> Int -> IO () Source #

memAlloc :: Storable a => Int -> IO (Ptr a) Source #

c'memRealloc :: Ptr () -> CInt -> IO (Ptr ()) Source #

memRealloc :: (Storable a, Storable b) => Ptr a -> Int -> IO (Ptr b) Source #

p'memRealloc :: FunPtr (Ptr () -> CInt -> IO (Ptr ())) Source #

c'memFree :: Ptr () -> IO () Source #

memFree :: Storable a => Ptr a -> IO () Source #

p'memFree :: FunPtr (Ptr () -> IO ()) Source #

setCameraMoveControls :: Int -> Int -> Int -> Int -> Int -> Int -> IO () Source #

drawPixel :: Int -> Int -> Color -> IO () Source #

c'drawLine :: CInt -> CInt -> CInt -> CInt -> Ptr Color -> IO () Source #

drawLine :: Int -> Int -> Int -> Int -> Color -> IO () Source #

p'drawLine :: FunPtr (CInt -> CInt -> CInt -> CInt -> Color -> IO ()) Source #

drawCircle :: Int -> Int -> Float -> Color -> IO () Source #

drawEllipse :: Int -> Int -> Float -> Float -> Color -> IO () Source #

drawRing :: Vector2 -> Float -> Float -> Float -> Float -> Int -> Color -> IO () Source #

drawRectangle :: Int -> Int -> Int -> Int -> Color -> IO () Source #

drawPoly :: Vector2 -> Int -> Float -> Float -> Color -> IO () Source #

checkCollisionLines :: Vector2 -> Vector2 -> Vector2 -> Vector2 -> Maybe Vector2 Source #

If a collision is found, returns Just collisionPoint, otherwise returns Nothing

loadImageAnim :: String -> IO (Image, Int) Source #

Returns the final image and the framees in a tuple, e.g. (img, 18)

unloadImageColors :: Ptr Color -> IO () Source #

NOTE: You usually won't need to use this. loadImageColors unloads the colors automatically. Only use this when you are using c'loadImageColors to load the colors.

unloadImagePalette :: Ptr Color -> IO () Source #

NOTE: You usually won't need to use this. loadImagePalette unloads the colors automatically. Only use this when you are using c'loadImagePalette to load the colors.

setPixelColor :: Ptr () -> Color -> Int -> IO () Source #

drawFPS :: Int -> Int -> IO () Source #

drawText :: String -> Int -> Int -> Int -> Color -> IO () Source #

textCopy :: CString -> CString -> IO CInt Source #

Not required in Haskell

textIsEqual :: CString -> CString -> IO CInt Source #

Not required in Haskell

textLength :: CString -> IO CUInt Source #

Not required in Haskell

textFormat :: CString -> IO CString Source #

Not required in Haskell

textSubtext :: CString -> CInt -> CInt -> IO CString Source #

Not required in Haskell

textReplace :: CString -> CString -> CString -> IO CString Source #

Not required in Haskell

textInsert :: CString -> CString -> CInt -> IO CString Source #

Not required in Haskell

textJoin :: Ptr CString -> CInt -> CString -> IO CString Source #

Not required in Haskell

textSplit :: CString -> CChar -> Ptr CInt -> IO (Ptr CString) Source #

Not required in Haskell

textAppend :: CString -> CString -> Ptr CInt -> IO () Source #

Not required in Haskell

textFindIndex :: CString -> CString -> IO CInt Source #

Not required in Haskell

textToUpper :: CString -> IO CString Source #

Not required in Haskell

textToLower :: CString -> IO CString Source #

Not required in Haskell

textToPascal :: CString -> IO CString Source #

Not required in Haskell

textToInteger :: CString -> IO CInt Source #

Not required in Haskell

drawRay :: Ray -> Color -> IO () Source #

drawGrid :: Int -> Float -> IO () Source #

c'updateMeshBuffer :: Ptr Mesh -> CInt -> Ptr () -> CInt -> CInt -> IO () Source #

updateMeshBuffer :: Mesh -> Int -> Ptr () -> Int -> Int -> IO () Source #

p'updateMeshBuffer :: FunPtr (Mesh -> CInt -> Ptr () -> CInt -> CInt -> IO ()) Source #

type AudioCallback = FunPtr (Ptr () -> CUInt -> IO ()) Source #

c'updateSound :: Ptr Sound -> Ptr () -> CInt -> IO () Source #

updateSound :: Sound -> Ptr () -> Int -> IO () Source #

p'updateSound :: FunPtr (Sound -> Ptr () -> CInt -> IO ()) Source #

waveFormat :: Wave -> Int -> Int -> Int -> IO () Source #