Skip to content

Commit b9dd14c

Browse files
committed
fix several typos in comments
1 parent 46676cd commit b9dd14c

29 files changed

+38
-38
lines changed

asmcomp/CSEgen.ml

+1-1
Original file line numberDiff line numberDiff line change
@@ -215,7 +215,7 @@ let insert_move srcs dsts i =
215215

216216
class cse_generic = object (self)
217217

218-
(* Default classification of operations. Can be overriden in
218+
(* Default classification of operations. Can be overridden in
219219
processor-specific files to classify specific operations better. *)
220220

221221
method class_of_operation op =

asmcomp/compilenv.mli

+2-2
Original file line numberDiff line numberDiff line change
@@ -94,7 +94,7 @@ val set_export_info: Export_info.t -> unit
9494
(* Record the informations of the unit being compiled
9595
flambda-only *)
9696
val approx_env: unit -> Export_info.t
97-
(* Returns all the information loaded from extenal compilation units
97+
(* Returns all the information loaded from external compilation units
9898
flambda-only *)
9999
val approx_for_global: Compilation_unit.t -> Export_info.t
100100
(* Loads the exported information declaring the compilation_unit
@@ -117,7 +117,7 @@ val function_label : Closure_id.t -> string
117117

118118
val new_structured_constant:
119119
Clambda.ustructured_constant ->
120-
shared:bool -> (* can be shared with another structually equal constant *)
120+
shared:bool -> (* can be shared with another structurally equal constant *)
121121
string
122122
val structured_constants:
123123
unit -> Clambda.preallocated_constant list

asmcomp/selectgen.mli

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

bytecomp/lambda.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -214,7 +214,7 @@ type function_kind = Curried | Tupled
214214

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

byterun/caml/misc.h

+1-1
Original file line numberDiff line numberDiff line change
@@ -73,7 +73,7 @@ typedef char * addr;
7373
#define CAMLprim
7474
#define CAMLextern extern
7575

76-
/* Weak function definitions that can be overriden by external libs */
76+
/* Weak function definitions that can be overridden by external libs */
7777
/* Conservatively restricted to ELF and MacOSX platforms */
7878
#if defined(__GNUC__) && (defined (__ELF__) || defined(__APPLE__))
7979
#define CAMLweakdef __attribute__((weak))

debugger/debugger_config.mli

+2-2
Original file line numberDiff line numberDiff line change
@@ -28,13 +28,13 @@ val runtime_program : string
2828
val history_size : int ref
2929
val load_path_for : (string, string list) Hashtbl.t
3030

31-
(*** Time travel paramaters. ***)
31+
(*** Time travel parameters. ***)
3232

3333
val checkpoint_big_step : int64 ref
3434
val checkpoint_small_step : int64 ref
3535
val checkpoint_max_count : int ref
3636
val make_checkpoints : bool ref
3737

38-
(*** Environment variables for debugee. ***)
38+
(*** Environment variables for debuggee. ***)
3939

4040
val environment : (string * string) list ref

debugger/primitives.ml

+1-1
Original file line numberDiff line numberDiff line change
@@ -45,7 +45,7 @@ let rec list_truncate =
4545
| (_, []) -> []
4646
| (n, (a::l)) -> a::(list_truncate (n - 1) l)
4747

48-
(* Separe the `n' first elements of `l' and the others *)
48+
(* Separate the `n' first elements of `l' and the others *)
4949
(* ### n list -> (first, last) *)
5050
let rec list_truncate2 =
5151
fun

debugger/primitives.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -34,7 +34,7 @@ val index : 'a -> 'a list -> int
3434
(* ### n l -> l' *)
3535
val list_truncate : int -> 'a list -> 'a list
3636

37-
(* Separe the `n' first elements of `l' and the others. *)
37+
(* Separate the `n' first elements of `l' and the others. *)
3838
(* ### n list -> (first, last) *)
3939
val list_truncate2 : int -> 'a list -> 'a list * 'a list
4040

debugger/program_management.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -22,7 +22,7 @@ val ensure_loaded : unit -> unit
2222
(*** Kill program. ***)
2323
val kill_program : unit -> unit
2424

25-
(* Ask wether to kill the program or not. *)
25+
(* Ask whether to kill the program or not. *)
2626
(* If yes, kill it. *)
2727
(* Return true iff the program has been killed. *)
2828
val ask_kill_program : unit -> bool

debugger/show_information.ml

+1-1
Original file line numberDiff line numberDiff line change
@@ -88,7 +88,7 @@ let show_one_frame framenum ppf event =
8888
(pos.Lexing.pos_cnum - pos.Lexing.pos_bol + 1)
8989

9090
(* Display information about the current frame. *)
91-
(* --- `select frame' must have succeded before calling this function. *)
91+
(* --- `select frame' must have succeeded before calling this function. *)
9292
let show_current_frame ppf selected =
9393
match !selected_event with
9494
| None ->

debugger/show_information.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -20,7 +20,7 @@ open Format;;
2020
val show_current_event : formatter -> unit;;
2121

2222
(* Display information about the current frame. *)
23-
(* --- `select frame' must have succeded before calling this function. *)
23+
(* --- `select frame' must have succeeded before calling this function. *)
2424
val show_current_frame : formatter -> bool -> unit;;
2525

2626
(* Display short information about one frame. *)

debugger/time_travel.ml

+3-3
Original file line numberDiff line numberDiff line change
@@ -119,7 +119,7 @@ let kill_checkpoint checkpoint =
119119

120120
(*** Cleaning the checkpoint list. ***)
121121

122-
(* Separe checkpoints before (<=) and after (>) `t'. *)
122+
(* Separate checkpoints before (<=) and after (>) `t'. *)
123123
(* ### t checkpoints -> (after, before) *)
124124
let cut t =
125125
let rec cut_t =
@@ -147,7 +147,7 @@ let cut2 t0 t l =
147147
let (after, before) = cut (t0 -- _1) l in
148148
after::(cut2_t0 t before)
149149

150-
(* Separe first elements and last element of a list of checkpoint. *)
150+
(* Separate first elements and last element of a list of checkpoint. *)
151151
let chk_merge2 cont =
152152
let rec chk_merge2_cont =
153153
function
@@ -160,7 +160,7 @@ let chk_merge2 cont =
160160
(accepted, a::rejected)
161161
in chk_merge2_cont
162162

163-
(* Separe the checkpoint list. *)
163+
(* Separate the checkpoint list. *)
164164
(* ### list -> accepted * rejected *)
165165
let rec chk_merge =
166166
function

middle_end/inline_and_simplify_aux.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -286,7 +286,7 @@ module Result : sig
286286
val set_approx : t -> Simple_value_approx.t -> t
287287

288288
(** Set the approximation of the subexpression to the meet of the
289-
current return aprroximation and the provided one. Typically
289+
current return approximation and the provided one. Typically
290290
used just before returning from a branch case of the
291291
simplification algorithm. *)
292292
val meet_approx : t -> Env.t -> Simple_value_approx.t -> t

middle_end/lift_constants.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -28,7 +28,7 @@
2828
[Inconstant_idents] is a "backwards" analysis that propagates implications
2929
about inconstantness of variables and set of closures IDs.
3030
31-
[Alias_analysis] is a "forwards" analysis that is analagous to the
31+
[Alias_analysis] is a "forwards" analysis that is analogous to the
3232
propagation of [Simple_value_approx.t] values during [Inline_and_simplify].
3333
It gives us information about relationships between values but not actually
3434
about their constantness.

middle_end/lift_let_to_initialize_symbol.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -22,7 +22,7 @@
2222
[Let]-expressions typically come from the compilation of modules (using
2323
the bytecode strategy) in [Translmod].
2424
25-
This means of compilation supercedes the old "transl_store_" methodology
25+
This means of compilation supersedes the old "transl_store_" methodology
2626
for native code.
2727
2828
An [Initialize_symbol] construction generated by this pass may be

ocamldoc/odoc_ast.mli

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

ocamldoc/odoc_config.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -13,7 +13,7 @@
1313
(* *)
1414
(**************************************************************************)
1515

16-
(** Ocamldoc configuration contants. *)
16+
(** Ocamldoc configuration constants. *)
1717

1818
(** Default path to search for custom generators and to install them. *)
1919
val custom_generators_path : string

ocamldoc/odoc_info.mli

+4-4
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@
1515

1616
(** Interface to the information collected in source files. *)
1717

18-
(** The differents kinds of element references. *)
18+
(** The different kinds of element references. *)
1919
type ref_kind = Odoc_types.ref_kind =
2020
RK_module
2121
| RK_module_type
@@ -121,7 +121,7 @@ module Name :
121121
(** [concat t1 t2] returns the concatenation of [t1] and [t2].*)
122122
val concat : t -> t -> t
123123

124-
(** Return the depth of the name, i.e. the numer of levels to the root.
124+
(** Return the depth of the name, i.e. the number of levels to the root.
125125
Example : [depth "Toto.Tutu.name"] = [3]. *)
126126
val depth : t -> int
127127

@@ -156,7 +156,7 @@ module Parameter :
156156

157157
(** {3 Functions} *)
158158

159-
(** Acces to the name as a string. For tuples, parenthesis and commas are added. *)
159+
(** Access to the name as a string. For tuples, parentheses and commas are added. *)
160160
val complete_name : parameter -> string
161161

162162
(** Access to the complete type. *)
@@ -368,7 +368,7 @@ module Class :
368368
capp_name : Name.t ; (** The complete name of the applied class. *)
369369
mutable capp_class : t_class option; (** The associated t_class if we found it. *)
370370
capp_params : Types.type_expr list; (** The type of expressions the class is applied to. *)
371-
capp_params_code : string list ; (** The code of these exprssions. *)
371+
capp_params_code : string list ; (** The code of these expressions. *)
372372
}
373373

374374
and class_constr = Odoc_class.class_constr =

ocamldoc/odoc_name.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -36,7 +36,7 @@ val normalize_name : t -> t
3636
(** Returns the head of a name. *)
3737
val head : t -> t
3838

39-
(** Returns the depth of the name, i.e. the numer of levels to the root.
39+
(** Returns the depth of the name, i.e. the number of levels to the root.
4040
Example : [Toto.Tutu.name] has depth 3. *)
4141
val depth : t -> int
4242

ocamldoc/odoc_sig.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -181,7 +181,7 @@ module Analyser :
181181
Odoc_name.t -> int -> Parsetree.class_type -> Types.class_type ->
182182
Odoc_class.class_type_kind
183183

184-
(** This function takes an interface file name, a file containg the code, a parse tree
184+
(** This function takes an interface file name, a file containing the code, a parse tree
185185
and the signature obtained from the compiler.
186186
It goes through the parse tree, creating values for encountered
187187
functions, modules, ..., looking in the source file for comments,

ocamldoc/odoc_types.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -15,7 +15,7 @@
1515

1616
(** Types for the information collected in comments. *)
1717

18-
(** The differents kinds of element references. *)
18+
(** The different kinds of element references. *)
1919
type ref_kind =
2020
RK_module
2121
| RK_module_type

stdlib/arg.mli

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

176176
val current : int ref

stdlib/format.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -170,7 +170,7 @@ val force_newline : unit -> unit
170170
(** Forces a new line in the current box.
171171
Not the normal way of pretty-printing, since the new line does not reset
172172
the current line count.
173-
You should prefer using break hints within a vertcal box. *)
173+
You should prefer using break hints within a vertical box. *)
174174

175175
val print_if_newline : unit -> unit
176176
(** Executes the next formatting command if the preceding line

stdlib/gc.mli

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

stdlib/list.mli

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

stdlib/listLabels.mli

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

stdlib/marshal.mli

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

stdlib/pervasives.mli

+3-3
Original file line numberDiff line numberDiff line change
@@ -594,7 +594,7 @@ external int_of_string : string -> int = "caml_int_of_string"
594594

595595

596596
val int_of_string_opt: string -> int option
597-
(** Same as [int_of_string], but returs [None] instead of raising.
597+
(** Same as [int_of_string], but returns [None] instead of raising.
598598
@since 4.05
599599
*)
600600

@@ -619,7 +619,7 @@ external float_of_string : string -> float = "caml_float_of_string"
619619
representation of a float. *)
620620

621621
val float_of_string_opt: string -> float option
622-
(** Same as [float_of_string], but returs [None] instead of raising.
622+
(** Same as [float_of_string], but returns [None] instead of raising.
623623
@since 4.05
624624
*)
625625

@@ -729,7 +729,7 @@ val read_int : unit -> int
729729
if the line read is not a valid representation of an integer. *)
730730

731731
val read_int_opt: unit -> int option
732-
(** Same as [read_int_opt], but returs [None] instead of raising.
732+
(** Same as [read_int_opt], but returns [None] instead of raising.
733733
@since 4.05
734734
*)
735735

stdlib/spacetime.mli

+1-1
Original file line numberDiff line numberDiff line change
@@ -71,7 +71,7 @@ module Series : sig
7171
val save_event : ?time:float -> t -> event_name:string -> unit
7272

7373
(** [save_and_close series] writes information into [series] required for
74-
interpeting the snapshots that [series] contains and then closes the
74+
interpreting the snapshots that [series] contains and then closes the
7575
[series] file. This function must be called to produce a valid series
7676
file.
7777
The optional [time] parameter is as for {!Snapshot.take}.

0 commit comments

Comments
 (0)