Safe Haskell | None |
---|---|
Language | Haskell2010 |
Aztecs.ECS.Commands
Documentation
newtype Commands (t :: (Type -> Type) -> Type -> Type) (m :: Type -> Type) a Source #
Constructors
Commands | |
Fields
|
Instances
MonadTrans t => MonadTrans (Commands t) Source # | |||||
Defined in Aztecs.ECS.Commands | |||||
(MonadTrans t, Monad (t m), MonadIO m) => MonadIO (Commands t m) Source # | |||||
Defined in Aztecs.ECS.Commands | |||||
(Monad (t m), Monad m) => Applicative (Commands t m) Source # | |||||
Defined in Aztecs.ECS.Commands | |||||
Functor m => Functor (Commands t m) Source # | |||||
(Monad (t m), Monad m) => Monad (Commands t m) Source # | |||||
(MonadTrans t, Monad (t m), PrimMonad m) => PrimMonad (Commands t m) Source # | |||||
(PrimMonad m, PrimState m ~ s, Lookup (ComponentStorage m a a) (WorldComponents m cs), Storage m (ComponentStorage m a)) => Queryable (AztecsT cs m) (W (Commands (AztecsT cs) m) a) Source # | |||||
Defined in Aztecs.Internal Associated Types
| |||||
type QueryableAccess (W (Commands (AztecsT cs) m) a) Source # | |||||
Defined in Aztecs.Internal | |||||
type PrimState (Commands t m) Source # | |||||
Defined in Aztecs.ECS.Commands |
runCommands :: forall t (m :: Type -> Type) a. (MonadTrans t, Monad (t m), Monad m) => Commands t m a -> t m a Source #