summaryrefslogtreecommitdiffstats
path: root/stdlib/arg.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/arg.mli')
-rw-r--r--stdlib/arg.mli5
1 files changed, 3 insertions, 2 deletions
diff --git a/stdlib/arg.mli b/stdlib/arg.mli
index ffb3ed180..58d71e161 100644
--- a/stdlib/arg.mli
+++ b/stdlib/arg.mli
@@ -97,8 +97,9 @@ val parse :
val parse_argv : string array ->
(key * spec * doc) list -> anon_fun -> usage_msg -> unit
(** [Arg.parse_argv args speclist anon_fun usage_msg] parses the array
- [args] as if it were the command line. It saves the value of
- [Arg.current] before starting and restores it before returning. *)
+ [args] as if it were the command line. It uses and updates the
+ value of [Arg.current]. You must set [Arg.current] before calling
+ [parse_argv], and restore it afterward if needed. *)
exception Bad of string
(** Functions in [spec] or [anon_fun] can raise [Arg.Bad] with an error