fix several typos in comments

master
Daniel 2017-02-13 17:09:50 +01:00
parent 46676cde6e
commit b9dd14cdaf
29 changed files with 38 additions and 38 deletions

View File

@ -215,7 +215,7 @@ let insert_move srcs dsts i =
class cse_generic = object (self)
(* Default classification of operations. Can be overriden in
(* Default classification of operations. Can be overridden in
processor-specific files to classify specific operations better. *)
method class_of_operation op =

View File

@ -94,7 +94,7 @@ val set_export_info: Export_info.t -> unit
(* Record the informations of the unit being compiled
flambda-only *)
val approx_env: unit -> Export_info.t
(* Returns all the information loaded from extenal compilation units
(* Returns all the information loaded from external compilation units
flambda-only *)
val approx_for_global: Compilation_unit.t -> Export_info.t
(* Loads the exported information declaring the compilation_unit
@ -117,7 +117,7 @@ val function_label : Closure_id.t -> string
val new_structured_constant:
Clambda.ustructured_constant ->
shared:bool -> (* can be shared with another structually equal constant *)
shared:bool -> (* can be shared with another structurally equal constant *)
string
val structured_constants:
unit -> Clambda.preallocated_constant list

View File

@ -81,7 +81,7 @@ class virtual selector_generic : object
(* informs the code emitter that the current function may call
a C function that never returns; by default, does nothing.
It is unecessary to save the stack pointer in this situation
It is unnecessary to save the stack pointer in this situation
(which is the main purpose of tracking leaf functions) but some
architectures still need to ensure that the stack is properly
aligned when the C function is called. This is achieved by

View File

@ -214,7 +214,7 @@ type function_kind = Curried | Tupled
type let_kind = Strict | Alias | StrictOpt | Variable
(* Meaning of kinds for let x = e in e':
Strict: e may have side-effets; always evaluate e first
Strict: e may have side-effects; always evaluate e first
(If e is a simple expression, e.g. a variable or constant,
we may still substitute e'[x/e].)
Alias: e is pure, we can substitute e'[x/e] if x has 0 or 1 occurrences

View File

@ -73,7 +73,7 @@ typedef char * addr;
#define CAMLprim
#define CAMLextern extern
/* Weak function definitions that can be overriden by external libs */
/* Weak function definitions that can be overridden by external libs */
/* Conservatively restricted to ELF and MacOSX platforms */
#if defined(__GNUC__) && (defined (__ELF__) || defined(__APPLE__))
#define CAMLweakdef __attribute__((weak))

View File

@ -28,13 +28,13 @@ val runtime_program : string
val history_size : int ref
val load_path_for : (string, string list) Hashtbl.t
(*** Time travel paramaters. ***)
(*** Time travel parameters. ***)
val checkpoint_big_step : int64 ref
val checkpoint_small_step : int64 ref
val checkpoint_max_count : int ref
val make_checkpoints : bool ref
(*** Environment variables for debugee. ***)
(*** Environment variables for debuggee. ***)
val environment : (string * string) list ref

View File

@ -45,7 +45,7 @@ let rec list_truncate =
| (_, []) -> []
| (n, (a::l)) -> a::(list_truncate (n - 1) l)
(* Separe the `n' first elements of `l' and the others *)
(* Separate the `n' first elements of `l' and the others *)
(* ### n list -> (first, last) *)
let rec list_truncate2 =
fun

View File

@ -34,7 +34,7 @@ val index : 'a -> 'a list -> int
(* ### n l -> l' *)
val list_truncate : int -> 'a list -> 'a list
(* Separe the `n' first elements of `l' and the others. *)
(* Separate the `n' first elements of `l' and the others. *)
(* ### n list -> (first, last) *)
val list_truncate2 : int -> 'a list -> 'a list * 'a list

View File

@ -22,7 +22,7 @@ val ensure_loaded : unit -> unit
(*** Kill program. ***)
val kill_program : unit -> unit
(* Ask wether to kill the program or not. *)
(* Ask whether to kill the program or not. *)
(* If yes, kill it. *)
(* Return true iff the program has been killed. *)
val ask_kill_program : unit -> bool

View File

@ -88,7 +88,7 @@ let show_one_frame framenum ppf event =
(pos.Lexing.pos_cnum - pos.Lexing.pos_bol + 1)
(* Display information about the current frame. *)
(* --- `select frame' must have succeded before calling this function. *)
(* --- `select frame' must have succeeded before calling this function. *)
let show_current_frame ppf selected =
match !selected_event with
| None ->

View File

@ -20,7 +20,7 @@ open Format;;
val show_current_event : formatter -> unit;;
(* Display information about the current frame. *)
(* --- `select frame' must have succeded before calling this function. *)
(* --- `select frame' must have succeeded before calling this function. *)
val show_current_frame : formatter -> bool -> unit;;
(* Display short information about one frame. *)

View File

@ -119,7 +119,7 @@ let kill_checkpoint checkpoint =
(*** Cleaning the checkpoint list. ***)
(* Separe checkpoints before (<=) and after (>) `t'. *)
(* Separate checkpoints before (<=) and after (>) `t'. *)
(* ### t checkpoints -> (after, before) *)
let cut t =
let rec cut_t =
@ -147,7 +147,7 @@ let cut2 t0 t l =
let (after, before) = cut (t0 -- _1) l in
after::(cut2_t0 t before)
(* Separe first elements and last element of a list of checkpoint. *)
(* Separate first elements and last element of a list of checkpoint. *)
let chk_merge2 cont =
let rec chk_merge2_cont =
function
@ -160,7 +160,7 @@ let chk_merge2 cont =
(accepted, a::rejected)
in chk_merge2_cont
(* Separe the checkpoint list. *)
(* Separate the checkpoint list. *)
(* ### list -> accepted * rejected *)
let rec chk_merge =
function

View File

@ -286,7 +286,7 @@ module Result : sig
val set_approx : t -> Simple_value_approx.t -> t
(** Set the approximation of the subexpression to the meet of the
current return aprroximation and the provided one. Typically
current return approximation and the provided one. Typically
used just before returning from a branch case of the
simplification algorithm. *)
val meet_approx : t -> Env.t -> Simple_value_approx.t -> t

View File

@ -28,7 +28,7 @@
[Inconstant_idents] is a "backwards" analysis that propagates implications
about inconstantness of variables and set of closures IDs.
[Alias_analysis] is a "forwards" analysis that is analagous to the
[Alias_analysis] is a "forwards" analysis that is analogous to the
propagation of [Simple_value_approx.t] values during [Inline_and_simplify].
It gives us information about relationships between values but not actually
about their constantness.

View File

@ -22,7 +22,7 @@
[Let]-expressions typically come from the compilation of modules (using
the bytecode strategy) in [Translmod].
This means of compilation supercedes the old "transl_store_" methodology
This means of compilation supersedes the old "transl_store_" methodology
for native code.
An [Initialize_symbol] construction generated by this pass may be

View File

@ -92,7 +92,7 @@ module Typedtree_search :
module Analyser :
functor (My_ir : Odoc_sig.Info_retriever) ->
sig
(** This function takes a file name, a file containg the code and
(** This function takes a file name, a file containing the code and
the typed tree obtained from the compiler.
It goes through the tree, creating values for encountered
functions, modules, ..., and looking in the source file for comments.*)

View File

@ -13,7 +13,7 @@
(* *)
(**************************************************************************)
(** Ocamldoc configuration contants. *)
(** Ocamldoc configuration constants. *)
(** Default path to search for custom generators and to install them. *)
val custom_generators_path : string

View File

@ -15,7 +15,7 @@
(** Interface to the information collected in source files. *)
(** The differents kinds of element references. *)
(** The different kinds of element references. *)
type ref_kind = Odoc_types.ref_kind =
RK_module
| RK_module_type
@ -121,7 +121,7 @@ module Name :
(** [concat t1 t2] returns the concatenation of [t1] and [t2].*)
val concat : t -> t -> t
(** Return the depth of the name, i.e. the numer of levels to the root.
(** Return the depth of the name, i.e. the number of levels to the root.
Example : [depth "Toto.Tutu.name"] = [3]. *)
val depth : t -> int
@ -156,7 +156,7 @@ module Parameter :
(** {3 Functions} *)
(** Acces to the name as a string. For tuples, parenthesis and commas are added. *)
(** Access to the name as a string. For tuples, parentheses and commas are added. *)
val complete_name : parameter -> string
(** Access to the complete type. *)
@ -368,7 +368,7 @@ module Class :
capp_name : Name.t ; (** The complete name of the applied class. *)
mutable capp_class : t_class option; (** The associated t_class if we found it. *)
capp_params : Types.type_expr list; (** The type of expressions the class is applied to. *)
capp_params_code : string list ; (** The code of these exprssions. *)
capp_params_code : string list ; (** The code of these expressions. *)
}
and class_constr = Odoc_class.class_constr =

View File

@ -36,7 +36,7 @@ val normalize_name : t -> t
(** Returns the head of a name. *)
val head : t -> t
(** Returns the depth of the name, i.e. the numer of levels to the root.
(** Returns the depth of the name, i.e. the number of levels to the root.
Example : [Toto.Tutu.name] has depth 3. *)
val depth : t -> int

View File

@ -181,7 +181,7 @@ module Analyser :
Odoc_name.t -> int -> Parsetree.class_type -> Types.class_type ->
Odoc_class.class_type_kind
(** This function takes an interface file name, a file containg the code, a parse tree
(** This function takes an interface file name, a file containing the code, a parse tree
and the signature obtained from the compiler.
It goes through the parse tree, creating values for encountered
functions, modules, ..., looking in the source file for comments,

View File

@ -15,7 +15,7 @@
(** Types for the information collected in comments. *)
(** The differents kinds of element references. *)
(** The different kinds of element references. *)
type ref_kind =
RK_module
| RK_module_type

View File

@ -170,7 +170,7 @@ val align: ?limit: int -> (key * spec * doc) list -> (key * spec * doc) list
align the whole string. The doc strings corresponding to
[Symbol] arguments are aligned on the next line.
@param limit options with keyword and message longer than
[limit] will not be used to compute the alignement.
[limit] will not be used to compute the alignment.
*)
val current : int ref

View File

@ -170,7 +170,7 @@ val force_newline : unit -> unit
(** Forces a new line in the current box.
Not the normal way of pretty-printing, since the new line does not reset
the current line count.
You should prefer using break hints within a vertcal box. *)
You should prefer using break hints within a vertical box. *)
val print_if_newline : unit -> unit
(** Executes the next formatting command if the preceding line

View File

@ -97,7 +97,7 @@ type control =
mutable space_overhead : int;
(** The major GC speed is computed from this parameter.
This is the memory that will be "wasted" because the GC does not
immediatly collect unreachable blocks. It is expressed as a
immediately collect unreachable blocks. It is expressed as a
percentage of the memory used for live data.
The GC will work more (use more CPU time and collect
blocks more eagerly) if [space_overhead] is smaller.

View File

@ -333,7 +333,7 @@ val merge : ('a -> 'a -> int) -> 'a list -> 'a list -> 'a list
(** Merge two lists:
Assuming that [l1] and [l2] are sorted according to the
comparison function [cmp], [merge cmp l1 l2] will return a
sorted list containting all the elements of [l1] and [l2].
sorted list containing all the elements of [l1] and [l2].
If several elements compare equal, the elements of [l1] will be
before the elements of [l2].
Not tail-recursive (sum of the lengths of the arguments).

View File

@ -338,7 +338,7 @@ val merge : cmp:('a -> 'a -> int) -> 'a list -> 'a list -> 'a list
(** Merge two lists:
Assuming that [l1] and [l2] are sorted according to the
comparison function [cmp], [merge cmp l1 l2] will return a
sorted list containting all the elements of [l1] and [l2].
sorted list containing all the elements of [l1] and [l2].
If several elements compare equal, the elements of [l1] will be
before the elements of [l2].
Not tail-recursive (sum of the lengths of the arguments).

View File

@ -36,7 +36,7 @@
belong to the given type.
Values of extensible variant types, for example exceptions (of
extensible type [exn]), returned by the unmarhsaller should not be
extensible type [exn]), returned by the unmarshaller should not be
pattern-matched over through [match ... with] or [try ... with],
because unmarshalling does not preserve the information required for
matching their constructors. Structural equalities with other

View File

@ -594,7 +594,7 @@ external int_of_string : string -> int = "caml_int_of_string"
val int_of_string_opt: string -> int option
(** Same as [int_of_string], but returs [None] instead of raising.
(** Same as [int_of_string], but returns [None] instead of raising.
@since 4.05
*)
@ -619,7 +619,7 @@ external float_of_string : string -> float = "caml_float_of_string"
representation of a float. *)
val float_of_string_opt: string -> float option
(** Same as [float_of_string], but returs [None] instead of raising.
(** Same as [float_of_string], but returns [None] instead of raising.
@since 4.05
*)
@ -729,7 +729,7 @@ val read_int : unit -> int
if the line read is not a valid representation of an integer. *)
val read_int_opt: unit -> int option
(** Same as [read_int_opt], but returs [None] instead of raising.
(** Same as [read_int_opt], but returns [None] instead of raising.
@since 4.05
*)

View File

@ -71,7 +71,7 @@ module Series : sig
val save_event : ?time:float -> t -> event_name:string -> unit
(** [save_and_close series] writes information into [series] required for
interpeting the snapshots that [series] contains and then closes the
interpreting the snapshots that [series] contains and then closes the
[series] file. This function must be called to produce a valid series
file.
The optional [time] parameter is as for {!Snapshot.take}.