Module Variable
Variable.t is the equivalent of a non-persistent Ident.t in the Flambda tree. It wraps an Ident.t together with its source compilation_unit. As such, it is unique within a whole program, not just one compilation unit.
Introducing a new type helps in tracing the source of identifiers when debugging the inliner. It also avoids Ident renaming when importing cmx files.
include Identifiable.S
module T : Identifiable.Thing with type t = tinclude Identifiable.Thing with type t := T.t
include Stdlib.Hashtbl.HashedType with type t := t
val hash : t -> intA hashing function on keys. It must be such that if two keys are equal according to
equal, then they have identical hash values as computed byhash. Examples: suitable (equal,hash) pairs for arbitrary key types include- (
(=),Hashtbl.hash) for comparing objects by structure (provided objects do not contain floats) - (
(fun x y -> compare x y = 0),Hashtbl.hash) for comparing objects by structure and handlingStdlib.nancorrectly - (
(==),Hashtbl.hash) for comparing objects by physical equality (e.g. for mutable or cyclic objects).
- (
include Stdlib.Map.OrderedType with type t := t
val compare : t -> t -> intA total ordering function over the keys. This is a two-argument function
fsuch thatf e1 e2is zero if the keyse1ande2are equal,f e1 e2is strictly negative ife1is smaller thane2, andf e1 e2is strictly positive ife1is greater thane2. Example: a suitable ordering function is the generic structural comparison functionStdlib.compare.
val output : Stdlib.out_channel -> t -> unitval print : Stdlib.Format.formatter -> t -> unit
module Set : Identifiable.Set with module T := Tmodule Map : Identifiable.Map with module T := Tmodule Tbl : Identifiable.Tbl with module T := Tval create : ?current_compilation_unit:Compilation_unit.t -> Internal_variable_names.t -> tval create_with_same_name_as_ident : Ident.t -> tval rename : ?current_compilation_unit:Compilation_unit.t -> t -> tval in_compilation_unit : t -> Compilation_unit.t -> boolval name : t -> stringval unique_name : t -> stringval get_compilation_unit : t -> Compilation_unit.tval print_list : Stdlib.Format.formatter -> t list -> unitval print_opt : Stdlib.Format.formatter -> t option -> unitval debug_when_stamp_matches : t -> stamp:int -> f:(unit -> unit) -> unitIf the given variable has the given stamp, call the user-supplied function. For debugging purposes only.
module Pair : Identifiable.S with type t := pairval compare_lists : t list -> t list -> intval output_full : Stdlib.out_channel -> t -> unitUnlike
output,output_fullincludes the compilation unit.