| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Godot.Nativescript
Synopsis
- type GdnativeHandle = Ptr ()
- class GodotClass a where
- registerClass :: forall a. (GodotClass a, Typeable a) => GdnativeHandle -> String -> (GodotObject -> IO a) -> (GodotObject -> a -> IO ()) -> IO ()
- typeTags :: TVar (Set (Ptr ()))
- tryObjectCast :: forall a. (GodotClass a, Typeable a) => GodotObject -> IO (Maybe a)
- copyVariant :: Ptr GodotVariant -> Ptr GodotVariant -> IO ()
- registerMethod :: forall a. GodotClass a => GdnativeHandle -> String -> GodotMethodRpcMode -> (GodotObject -> a -> Vector GodotVariant -> IO GodotVariant) -> IO ()
- data PropertyAttributes = PropertyAttributes {}
- asGodotPropertyAttributes :: PropertyAttributes -> IO GodotPropertyAttributes
- registerProperty :: forall a. GodotClass a => GdnativeHandle -> String -> PropertyAttributes -> (GodotObject -> a -> GodotVariant -> IO ()) -> (GodotObject -> a -> IO GodotVariant) -> IO ()
- data SignalArgument = SignalArgument {}
- asGodotSignalArgument :: SignalArgument -> IO GodotSignalArgument
- withVariantArray' :: [Variant GodotTy] -> ((Ptr GodotVariant, CInt) -> IO a) -> IO a
- registerSignal :: forall a. GodotClass a => GdnativeHandle -> Proxy a -> Text -> [SignalArgument] -> [Variant GodotTy] -> IO ()
Documentation
type GdnativeHandle = Ptr () Source #
Arguments
| :: (GodotClass a, Typeable a) | |
| => GdnativeHandle | |
| -> String | base class |
| -> (GodotObject -> IO a) | create action |
| -> (GodotObject -> a -> IO ()) | destroy action |
| -> IO () |
tryObjectCast :: forall a. (GodotClass a, Typeable a) => GodotObject -> IO (Maybe a) Source #
Arguments
| :: Ptr GodotVariant | destination |
| -> Ptr GodotVariant | source |
| -> IO () |
Arguments
| :: GodotClass a | |
| => GdnativeHandle | |
| -> String | method name |
| -> GodotMethodRpcMode | |
| -> (GodotObject -> a -> Vector GodotVariant -> IO GodotVariant) | |
| -> IO () |
data PropertyAttributes Source #
Constructors
| PropertyAttributes | |
Arguments
| :: GodotClass a | |
| => GdnativeHandle | |
| -> String | property path |
| -> PropertyAttributes | |
| -> (GodotObject -> a -> GodotVariant -> IO ()) | set func. godot variants destroyed at end of call |
| -> (GodotObject -> a -> IO GodotVariant) | get func |
| -> IO () |
data SignalArgument Source #
Constructors
| SignalArgument | |
withVariantArray' :: [Variant GodotTy] -> ((Ptr GodotVariant, CInt) -> IO a) -> IO a Source #
Arguments
| :: GodotClass a | |
| => GdnativeHandle | |
| -> Proxy a | |
| -> Text | signal name |
| -> [SignalArgument] | args |
| -> [Variant GodotTy] | default args |
| -> IO () |