Module UEnt

module UEnt: sig .. end
Entity/Component Oriented Game/Multimedia Module


Note: This is an experimentation, not a final work.

Entities


type id = Ent.id 
id of an entity, entities have an id only after been added to the world
type entity = Comp.entity 
this is the base type of the entity / component concept
val get_id : entity -> id
raises an exception if the entity has not been added to the world
val get_id_opt : entity -> id option
same than get_id but returns None instead of raising an exception

World


type world = Comp.world 
for the 'delta type parameter see the doc of the function world_step

and see world_step_fold about the 'fld type

val new_world : unit -> world
val add_entity : world -> entity -> world
val add_entities : world -> entity list -> world
val add_entity_id : world -> entity -> world * id
same than add_entity but also return the id that was given to this entity
val add_entities_id : world -> entity list -> world * id list
val add_entities_init : w:world -> n:int -> f:(int -> entity) -> world
val has_entity : world -> id -> bool
does an entity exists with the given id
val replace_entity : world -> id -> entity -> world
val remove_entity : world -> entity -> world
val remove_entity_id : world -> id -> world

World Getters


val get_entity : world -> id -> entity
val get_entity_opt : world -> id -> entity option
get an entity by its id
val get_entities : world -> id list -> entity list
ids not found are just skipped
val do_get_entities : world -> id list -> entity list
raises Not_found if an id is not found
val get_entities_with_components : world -> Comp.component_type list -> entity list

World Iterators


val iter_entities : (entity -> unit) -> world -> unit
val fold_entities : (entity -> 'p -> 'p) -> world -> 'p -> 'p
val num_entities : world -> int
val num_entities_with_components : world -> Comp.component_type list -> int

Mappers



a system will be only applied to the entities that contain all the component types of the associated mapper
type mapper = Comp.component_type Ent.mapper 
val add_mapper : world -> Comp.component_type list -> world * mapper

Systems



A system may update or remove entities, or create new ones, each time world_step is called.
type 'a update = 'a Ent.update 
type 'delta system = (Comp.component_type, Comp.component, 'delta) Ent.system 
the first returned value should be the input entity with eventual changes and the second returned value is eventual new entities that should be added to the world

Foldable Systems


type ('delta, 'fld) foldable_system = (Comp.component_type, Comp.component, 'delta, 'fld) Ent.foldable_system 
similar than system but a foldable_system has an additional folded parameter that can be given with world_step_fold

World Step



the heart beats here
type 'fld born_feedback_func = (Comp.component_type, Comp.component, 'fld) Ent.born_feedback_func 
val world_step : world -> 'delta system -> mapper -> 'delta -> world
'delta is the input parameter that is given to the systems
val world_step_fold : world ->
('delta, 'fld) foldable_system ->
mapper ->
?fb:'fld born_feedback_func -> 'delta -> 'fld -> world * 'fld
same than world_step but with an additional folded parameter 'fld, see foldable_systems