77bcef6
From 44306329db8a86a2362b6345bdde69deea4935dc Mon Sep 17 00:00:00 2001
77bcef6
From: David Allsopp <david.allsopp@metastack.com>
77bcef6
Date: Wed, 24 Jul 2019 14:45:33 +0100
77bcef6
Subject: [PATCH 2/9] Fix spelling errors reported by Lintian
77bcef6
77bcef6
No change entry needed
77bcef6
---
77bcef6
 asmcomp/cmmgen.ml                                         | 4 ++--
77bcef6
 manual/manual/library/compilerlibs.etex                   | 2 +-
77bcef6
 middle_end/inlining_transforms.ml                         | 2 +-
77bcef6
 otherlibs/systhreads/event.mli                            | 4 ++--
77bcef6
 parsing/ast_iterator.mli                                  | 2 +-
77bcef6
 parsing/ast_mapper.mli                                    | 2 +-
77bcef6
 stdlib/bigarray.mli                                       | 2 +-
77bcef6
 stdlib/filename.mli                                       | 4 ++--
77bcef6
 stdlib/format.ml                                          | 2 +-
77bcef6
 testsuite/tests/parsetree/source.ml                       | 2 +-
77bcef6
 testsuite/tests/typing-implicit_unpack/implicit_unpack.ml | 2 +-
77bcef6
 11 files changed, 14 insertions(+), 14 deletions(-)
77bcef6
77bcef6
diff --git a/asmcomp/cmmgen.ml b/asmcomp/cmmgen.ml
77bcef6
index d0490998c..68e36d0d9 100644
77bcef6
--- a/asmcomp/cmmgen.ml
77bcef6
+++ b/asmcomp/cmmgen.ml
77bcef6
@@ -1528,8 +1528,8 @@ end
77bcef6
    phases, we only share exits *)
77bcef6
 (* Some specific patterns can lead to switches where several cases
77bcef6
    point to the same action, but this action is not an exit (see GPR#1370).
77bcef6
-   The addition of the index in the action array as context allows to
77bcef6
-   share them correctly without duplication. *)
77bcef6
+   The addition of the index in the action array as context allows
77bcef6
+   sharing them correctly without duplication. *)
77bcef6
 module StoreExpForSwitch =
77bcef6
   Switch.CtxStore
77bcef6
     (struct
77bcef6
diff --git a/manual/manual/library/compilerlibs.etex b/manual/manual/library/compilerlibs.etex
77bcef6
index 88abbb823..d49193767 100644
77bcef6
--- a/manual/manual/library/compilerlibs.etex
77bcef6
+++ b/manual/manual/library/compilerlibs.etex
77bcef6
@@ -3,7 +3,7 @@
77bcef6
 
77bcef6
 This chapter describes the OCaml front-end, which declares the abstract
77bcef6
 syntax tree used by the compiler, provides a way to parse, print
77bcef6
-and pretty-print OCaml code, and ultimately allows to write abstract
77bcef6
+and pretty-print OCaml code, and ultimately allows one to write abstract
77bcef6
 syntax tree preprocessors invoked via the {\tt -ppx} flag (see chapters~\ref{c:camlc}
77bcef6
 and~\ref{c:nativecomp}) and plugins invoked via the {\tt -plugin} flag
77bcef6
 (see chapter~\ref{c:plugins}).
77bcef6
diff --git a/middle_end/inlining_transforms.ml b/middle_end/inlining_transforms.ml
77bcef6
index b08e62bb0..c46a6cbe6 100755
77bcef6
--- a/middle_end/inlining_transforms.ml
77bcef6
+++ b/middle_end/inlining_transforms.ml
77bcef6
@@ -118,7 +118,7 @@ let inline_by_copying_function_body ~env ~r
77bcef6
     && ((not default_inline) || (not default_specialise)) then
77bcef6
       (* When the function inlined function is a stub, the annotation
77bcef6
          is reported to the function applications inside the stub.
77bcef6
-         This allows to report the annotation to the application the
77bcef6
+         This allows reporting the annotation to the application the
77bcef6
          original programmer really intended: the stub is not visible
77bcef6
          in the source. *)
77bcef6
       set_inline_attribute_on_all_apply body
77bcef6
diff --git a/otherlibs/systhreads/event.mli b/otherlibs/systhreads/event.mli
77bcef6
index 83dbe9a17..fd452652c 100644
77bcef6
--- a/otherlibs/systhreads/event.mli
77bcef6
+++ b/otherlibs/systhreads/event.mli
77bcef6
@@ -59,8 +59,8 @@ val wrap_abort : 'a event -> (unit -> unit) -> 'a event
77bcef6
 
77bcef6
 val guard : (unit -> 'a event) -> 'a event
77bcef6
 (** [guard fn] returns the event that, when synchronized, computes
77bcef6
-   [fn()] and behaves as the resulting event. This allows to
77bcef6
-   compute events with side-effects at the time of the synchronization
77bcef6
+   [fn()] and behaves as the resulting event. This enables
77bcef6
+   computing events with side-effects at the time of the synchronization
77bcef6
    operation. *)
77bcef6
 
77bcef6
 val sync : 'a event -> 'a
77bcef6
diff --git a/parsing/ast_iterator.mli b/parsing/ast_iterator.mli
77bcef6
index 5dc1c0ec5..26308d20d 100755
77bcef6
--- a/parsing/ast_iterator.mli
77bcef6
+++ b/parsing/ast_iterator.mli
77bcef6
@@ -13,7 +13,7 @@
77bcef6
 (*                                                                        *)
77bcef6
 (**************************************************************************)
77bcef6
 
77bcef6
-(** {!iterator} allows to implement AST inspection using open recursion.  A
77bcef6
+(** {!iterator} enables AST inspection using open recursion.  A
77bcef6
     typical mapper would be based on {!default_iterator}, a trivial iterator,
77bcef6
     and will fall back on it for handling the syntax it does not modify.
77bcef6
 
77bcef6
diff --git a/parsing/ast_mapper.mli b/parsing/ast_mapper.mli
77bcef6
index b342ca8a9..80d70fcca 100644
77bcef6
--- a/parsing/ast_mapper.mli
77bcef6
+++ b/parsing/ast_mapper.mli
77bcef6
@@ -21,7 +21,7 @@
77bcef6
   the -ppx rewriters, handling such details as the serialization format,
77bcef6
   forwarding of command-line flags, and storing state.
77bcef6
 
77bcef6
-  {!mapper} allows to implement AST rewriting using open recursion.
77bcef6
+  {!mapper} enables AST rewriting using open recursion.
77bcef6
   A typical mapper would be based on {!default_mapper}, a deep
77bcef6
   identity mapper, and will fall back on it for handling the syntax it
77bcef6
   does not modify. For example:
77bcef6
diff --git a/stdlib/bigarray.mli b/stdlib/bigarray.mli
77bcef6
index 2c1261212..ea26f66f5 100644
77bcef6
--- a/stdlib/bigarray.mli
77bcef6
+++ b/stdlib/bigarray.mli
77bcef6
@@ -133,7 +133,7 @@ type ('a, 'b) kind =
77bcef6
    of OCaml types with element kinds, and are re-exported below for
77bcef6
    backward-compatibility reasons.
77bcef6
 
77bcef6
-   Using a generalized algebraic datatype (GADT) here allows to write
77bcef6
+   Using a generalized algebraic datatype (GADT) here allows writing
77bcef6
    well-typed polymorphic functions whose return type depend on the
77bcef6
    argument type, such as:
77bcef6
 
77bcef6
diff --git a/stdlib/filename.mli b/stdlib/filename.mli
77bcef6
index b05ad0d2e..9221c9ef5 100644
77bcef6
--- a/stdlib/filename.mli
77bcef6
+++ b/stdlib/filename.mli
77bcef6
@@ -52,8 +52,8 @@ val check_suffix : string -> string -> bool
77bcef6
 val chop_suffix : string -> string -> string
77bcef6
 (** [chop_suffix name suff] removes the suffix [suff] from
77bcef6
    the filename [name]. The behavior is undefined if [name] does not
77bcef6
-   end with the suffix [suff]. It is thus recommmended to use
77bcef6
-   [chop_suffix_opt] instead.
77bcef6
+   end with the suffix [suff]. [chop_suffix_opt] is thus recommended
77bcef6
+   instead.
77bcef6
 *)
77bcef6
 
77bcef6
 val chop_suffix_opt: suffix:string -> string -> string option
77bcef6
diff --git a/stdlib/format.ml b/stdlib/format.ml
77bcef6
index ae1f3c647..369c50c36 100644
77bcef6
--- a/stdlib/format.ml
77bcef6
+++ b/stdlib/format.ml
77bcef6
@@ -687,7 +687,7 @@ let pp_print_if_newline state () =
77bcef6
       { size = Size.zero; token = Pp_if_newline; length = 0 }
77bcef6
 
77bcef6
 
77bcef6
-(* Generalized break hint that allows to print strings before/after
77bcef6
+(* Generalized break hint that allows printing strings before/after
77bcef6
    same-line offset (width) or new-line offset *)
77bcef6
 let pp_print_custom_break state ~fits ~breaks =
77bcef6
   let before, width, after = fits in
77bcef6
diff --git a/testsuite/tests/parsetree/source.ml b/testsuite/tests/parsetree/source.ml
77bcef6
index c67012e18..a183f4482 100644
77bcef6
--- a/testsuite/tests/parsetree/source.ml
77bcef6
+++ b/testsuite/tests/parsetree/source.ml
77bcef6
@@ -3072,7 +3072,7 @@ Error: Types marked with the immediate attribute must be
77bcef6
        non-pointer types like int or bool
77bcef6
 |}];;
77bcef6
 (*
77bcef6
-   Implicit unpack allows to omit the signature in (val ...) expressions.
77bcef6
+   Implicit unpack allows the signature in (val ...) expressions to be omitted.
77bcef6
 
77bcef6
    It also adds (module M : S) and (module M) patterns, relying on
77bcef6
    implicit (val ...) for the implementation. Such patterns can only
77bcef6
diff --git a/testsuite/tests/typing-implicit_unpack/implicit_unpack.ml b/testsuite/tests/typing-implicit_unpack/implicit_unpack.ml
77bcef6
index a6b4d697c..e503ee736 100644
77bcef6
--- a/testsuite/tests/typing-implicit_unpack/implicit_unpack.ml
77bcef6
+++ b/testsuite/tests/typing-implicit_unpack/implicit_unpack.ml
77bcef6
@@ -3,7 +3,7 @@
77bcef6
 *)
77bcef6
 
77bcef6
 (*
77bcef6
-   Implicit unpack allows to omit the signature in (val ...) expressions.
77bcef6
+   Implicit unpack allows the signature in (val ...) expressions to be omitted.
77bcef6
 
77bcef6
    It also adds (module M : S) and (module M) patterns, relying on
77bcef6
    implicit (val ...) for the implementation. Such patterns can only
77bcef6
-- 
77bcef6
2.22.0.rc3
77bcef6