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, 5 insertions, 0 deletions
diff --git a/stdlib/arg.mli b/stdlib/arg.mli
index a4be84d58..cea753a50 100644
--- a/stdlib/arg.mli
+++ b/stdlib/arg.mli
@@ -78,6 +78,11 @@ val parse :
own [-help] and [--help] options in [speclist].
*)
+val parse_array : string array ->
+ (string * spec * string) list -> (string -> unit) -> string -> unit
+(** [Arg.parse_array a speclist anonfun usage_msg] parses array [a] as
+ if it were the the command line. *)
+
exception Bad of string
(** Functions in [spec] or [anonfun] can raise [Arg.Bad] with an error
message to reject invalid arguments. *)