Fixed grammar in user-facing comments and README

master
Max Mouratov 2017-03-29 02:05:29 +05:00 committed by David Allsopp
parent 4cf3be76d8
commit 485c2e68d3
12 changed files with 14 additions and 14 deletions

View File

@ -49,7 +49,7 @@
({!Bigarray.int16_signed_elt} or {!Bigarray.int16_unsigned_elt}),
- OCaml integers (signed, 31 bits on 32-bit architectures,
63 bits on 64-bit architectures) ({!Bigarray.int_elt}),
- 32-bit signed integer ({!Bigarray.int32_elt}),
- 32-bit signed integers ({!Bigarray.int32_elt}),
- 64-bit signed integers ({!Bigarray.int64_elt}),
- platform-native signed integers (32 bits on 32-bit architectures,
64 bits on 64-bit architectures) ({!Bigarray.nativeint_elt}).

View File

@ -27,7 +27,7 @@
Condition.wait c m
done;
(* Modify D *)
if (* the predicate P over D is now satified *) then Condition.signal c;
if (* the predicate P over D is now satisfied *) then Condition.signal c;
Mutex.unlock m
]}
*)

View File

@ -83,7 +83,7 @@ val select :
Unix.file_descr list -> Unix.file_descr list ->
Unix.file_descr list -> float ->
Unix.file_descr list * Unix.file_descr list * Unix.file_descr list
(** Suspend the execution of the calling thead until input/output
(** Suspend the execution of the calling thread until input/output
becomes possible on the given Unix file descriptors.
The arguments and results have the same meaning as for
[Unix.select].

View File

@ -27,7 +27,7 @@
Condition.wait c m
done;
(* Modify D *)
if (* the predicate P over D is now satified *) then Condition.signal c;
if (* the predicate P over D is now satisfied *) then Condition.signal c;
Mutex.unlock m
]}
*)

View File

@ -82,7 +82,7 @@ val select :
Unix.file_descr list -> Unix.file_descr list -> Unix.file_descr list ->
float ->
Unix.file_descr list * Unix.file_descr list * Unix.file_descr list
(** Suspend the execution of the calling thead until input/output
(** Suspend the execution of the calling thread until input/output
becomes possible on the given Unix file descriptors.
The arguments and results have the same meaning as for
{!Unix.select}. *)
@ -125,7 +125,7 @@ val critical_section : bool ref
(the timer interrupt that transfers control from thread to thread),
causing the current thread to run uninterrupted until
[critical_section] is reset to [false] or the current thread
explicitely relinquishes control using [sleep], [delay],
explicitly relinquishes control using [sleep], [delay],
[wait_inchan] or [wait_descr]. *)
val sleep : unit -> unit

View File

@ -742,7 +742,7 @@ val symlink : ?to_dir:bool -> string -> string -> unit
points to a directory or a file; if omitted, [symlink] examines [source]
using [stat] and picks appropriately, if [source] does not exist then [false]
is assumed (for this reason, it is recommended that the [~to_dir] parameter
be specified in new code). On Unix, [~to_dir] ignored.
be specified in new code). On Unix, [~to_dir] is ignored.
Windows symbolic links are available in Windows Vista onwards. There are some
important differences between Windows symlinks and their POSIX counterparts.

View File

@ -48,7 +48,7 @@ external length : bytes -> int = "%bytes_length"
external get : bytes -> int -> char = "%bytes_safe_get"
(** [get s n] returns the byte at index [n] in argument [s].
Raise [Invalid_argument] if [n] not a valid index in [s]. *)
Raise [Invalid_argument] if [n] is not a valid index in [s]. *)
external set : bytes -> int -> char -> unit = "%bytes_safe_set"
(** [set s n c] modifies [s] in place, replacing the byte at index [n]

View File

@ -23,7 +23,7 @@ external length : bytes -> int = "%bytes_length"
external get : bytes -> int -> char = "%bytes_safe_get"
(** [get s n] returns the byte at index [n] in argument [s].
Raise [Invalid_argument] if [n] not a valid index in [s]. *)
Raise [Invalid_argument] if [n] is not a valid index in [s]. *)
external set : bytes -> int -> char -> unit = "%bytes_safe_set"

View File

@ -358,10 +358,10 @@ module GenHashTable: sig
(** [get_key cont] returns the keys if they are all alive *)
val get_data: 'a container -> 'a option
(** [get_data cont] return the data if it is alive *)
(** [get_data cont] returns the data if it is alive *)
val set_key_data: 'a container -> t -> 'a -> unit
(** [set_key_data cont] modify the key and data *)
(** [set_key_data cont] modifies the key and data *)
val check_key: 'a container -> bool
(** [check_key cont] checks if all the keys contained in the data

View File

@ -153,7 +153,7 @@ module type S =
val exists: (key -> 'a -> bool) -> 'a t -> bool
(** [exists p m] checks if at least one binding of the map
satisfy the predicate [p].
satisfies the predicate [p].
@since 3.12.0
*)

View File

@ -90,7 +90,7 @@ val to_channel : out_channel -> 'a -> extern_flags list -> unit
digest of the code transmitted along with the code position.)
The exact definition of which free variables are captured in a
closure is not specified and can very between bytecode and native
closure is not specified and can vary between bytecode and native
code (and according to optimization flags). In particular, a
function value accessing a global reference may or may not include
the reference in its closure. If it does, unmarshaling the

View File

@ -182,7 +182,7 @@ val compare: t -> t -> int
{!Set.Make} and {!Map.Make}. *)
val equal: t -> t -> bool
(** The equal function for natives ints.
(** The equal function for native ints.
@since 4.03.0 *)
(**/**)