[ { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Parsing of command line arguments.\n\n This module provides a general mechanism for extracting options and\n arguments from the command line to the program. For example:\n\n{[\n let usage_msg = \"append [-verbose] [] ... -o \"\n let verbose = ref false\n let input_files = ref []\n let output_file = ref \"\"\n\n let anon_fun filename =\n input_files := filename::!input_files\n\n let speclist =\n [(\"-verbose\", Arg.Set verbose, \"Output debug information\");\n (\"-o\", Arg.Set_string output_file, \"Set output file name\")]\n\n let () =\n Arg.parse speclist anon_fun usage_msg;\n (* Main functionality here *)\n]}\n\n Syntax of command lines:\n A keyword is a character string starting with a [-].\n An option is a keyword alone or followed by an argument.\n The types of keywords are: [Unit], [Bool], [Set], [Clear],\n [String], [Set_string], [Int], [Set_int], [Float], [Set_float],\n [Tuple], [Symbol], [Rest], [Rest_all] and [Expand].\n\n [Unit], [Set] and [Clear] keywords take no argument.\n\n A [Rest] or [Rest_all] keyword takes the remainder of the command line\n as arguments. (More explanations below.)\n\n Every other keyword takes the following word on the command line\n as argument. For compatibility with GNU getopt_long, [keyword=arg]\n is also allowed.\n Arguments not preceded by a keyword are called anonymous arguments.\n\n Examples ([cmd] is assumed to be the command name):\n- [cmd -flag ](a unit option)\n- [cmd -int 1 ](an int option with argument [1])\n- [cmd -string foobar ](a string option with argument [\"foobar\"])\n- [cmd -float 12.34 ](a float option with argument [12.34])\n- [cmd a b c ](three anonymous arguments: [\"a\"], [\"b\"], and [\"c\"])\n- [cmd a b -- c d ](two anonymous arguments and a rest option with\n two arguments)\n\n [Rest] takes a function that is called repeatedly for each\n remaining command line argument. [Rest_all] takes a function that\n is called once, with the list of all remaining arguments.\n\n Note that if no arguments follow a [Rest] keyword then the function\n is not called at all whereas the function for a [Rest_all] keyword\n is called with an empty list.\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 72, "pos_bol": 3363, "pos_cnum": 3365 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 72, "pos_bol": 3363, "pos_cnum": 3365 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 72, "pos_bol": 3363, "pos_cnum": 3365 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 72, "pos_bol": 3363, "pos_cnum": 3365 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 72, "pos_bol": 3363, "pos_cnum": 3365 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3371 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3376 }, "loc_ghost": false }, "txt2": "alert" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_apply", { "pexp_desc": [ "Pexp_ident", "unsynchronized_access" ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3377 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3398 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [ [ [ "Nolabel" ], { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", "The Arg module relies on a mutable global state, parsing functions should only be called from a single domain.", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 75, "pos_bol": 3399, "pos_cnum": 3404 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 76, "pos_bol": 3480, "pos_cnum": 3521 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 75, "pos_bol": 3399, "pos_cnum": 3403 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 76, "pos_bol": 3480, "pos_cnum": 3522 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] } ] ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3377 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 76, "pos_bol": 3480, "pos_cnum": 3522 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3377 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 76, "pos_bol": 3480, "pos_cnum": 3522 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3367 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 77, "pos_bol": 3523, "pos_cnum": 3524 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 74, "pos_bol": 3367, "pos_cnum": 3367 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 77, "pos_bol": 3523, "pos_cnum": 3524 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 79, "pos_bol": 3526, "pos_cnum": 3531 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 79, "pos_bol": 3526, "pos_cnum": 3535 }, "loc_ghost": false }, "txt2": "spec" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3542 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3546 }, "loc_ghost": false }, "txt2": "Unit" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3551 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3555 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3559 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3563 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3551 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3563 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3540 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3564 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Call the function with unit argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3569 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3612 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3569 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3612 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3569 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3612 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3569 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 80, "pos_bol": 3538, "pos_cnum": 3612 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3617 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3621 }, "loc_ghost": false }, "txt2": "Bool" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3626 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3630 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3634 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3638 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3626 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3638 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3615 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3639 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Call the function with a bool argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3644 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3689 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3644 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3689 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3644 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3689 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3644 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 81, "pos_bol": 3613, "pos_cnum": 3689 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3694 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3697 }, "loc_ghost": false }, "txt2": "Set" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3701 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3705 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3701 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3692 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3709 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Set the reference to true ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3721 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3753 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3721 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3753 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3721 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3753 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3721 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 82, "pos_bol": 3690, "pos_cnum": 3753 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3758 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3763 }, "loc_ghost": false }, "txt2": "Clear" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3767 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3767 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3775 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3756 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3775 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Set the reference to false ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3785 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3818 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3785 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3818 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3785 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3818 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3785 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 83, "pos_bol": 3754, "pos_cnum": 3818 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3823 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3829 }, "loc_ghost": false }, "txt2": "String" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3834 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3840 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3848 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3834 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3848 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3821 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3849 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Call the function with a string argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3850 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3897 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3850 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3897 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3850 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3897 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3850 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 84, "pos_bol": 3819, "pos_cnum": 3897 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3902 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3912 }, "loc_ghost": false }, "txt2": "Set_string" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3916 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3922 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3916 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3926 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3900 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3926 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Set the reference to the string argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3929 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3976 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3929 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3976 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3929 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3976 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3929 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 85, "pos_bol": 3898, "pos_cnum": 3976 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3981 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3984 }, "loc_ghost": false }, "txt2": "Int" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3989 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3992 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3996 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3989 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 3979 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4001 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Call the function with an int argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4008 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4053 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4008 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4053 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4008 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4053 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4008 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 86, "pos_bol": 3977, "pos_cnum": 4053 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4058 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4065 }, "loc_ghost": false }, "txt2": "Set_int" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4069 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4072 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4069 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4076 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4056 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4076 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Set the reference to the int argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4085 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4129 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4085 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4129 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4085 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4129 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4085 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 87, "pos_bol": 4054, "pos_cnum": 4129 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4134 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4139 }, "loc_ghost": false }, "txt2": "Float" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4144 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4149 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4153 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4144 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4132 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4158 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Call the function with a float argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4161 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4207 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4161 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4207 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4161 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4207 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4161 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 88, "pos_bol": 4130, "pos_cnum": 4207 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4212 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4221 }, "loc_ghost": false }, "txt2": "Set_float" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4225 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4230 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4225 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4234 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4210 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4234 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Set the reference to the float argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4239 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4285 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4239 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4285 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4239 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4285 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4239 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 89, "pos_bol": 4208, "pos_cnum": 4285 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4290 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4295 }, "loc_ghost": false }, "txt2": "Tuple" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4299 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4299 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4308 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4288 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4308 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Take several arguments according to the\n spec list ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4317 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 91, "pos_bol": 4361, "pos_cnum": 4408 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4317 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 91, "pos_bol": 4361, "pos_cnum": 4408 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4317 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 91, "pos_bol": 4361, "pos_cnum": 4408 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 90, "pos_bol": 4286, "pos_cnum": 4317 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 91, "pos_bol": 4361, "pos_cnum": 4408 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4413 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4419 }, "loc_ghost": false }, "txt2": "Symbol" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4423 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4429 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4423 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4434 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4438 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4444 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4448 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4452 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4438 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4452 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4411 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 92, "pos_bol": 4409, "pos_cnum": 4453 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Take one of the symbols as argument and\n call the function with the symbol ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 93, "pos_bol": 4454, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 94, "pos_bol": 4529, "pos_cnum": 4600 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 93, "pos_bol": 4454, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 94, "pos_bol": 4529, "pos_cnum": 4600 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 93, "pos_bol": 4454, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 94, "pos_bol": 4529, "pos_cnum": 4600 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 93, "pos_bol": 4454, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 94, "pos_bol": 4529, "pos_cnum": 4600 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4605 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4609 }, "loc_ghost": false }, "txt2": "Rest" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4614 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4620 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4624 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4628 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4614 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4628 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4603 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4629 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Stop interpreting keywords and call the\n function with each remaining argument ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4632 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 96, "pos_bol": 4676, "pos_cnum": 4751 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4632 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 96, "pos_bol": 4676, "pos_cnum": 4751 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4632 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 96, "pos_bol": 4676, "pos_cnum": 4751 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 95, "pos_bol": 4601, "pos_cnum": 4632 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 96, "pos_bol": 4676, "pos_cnum": 4751 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4756 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4764 }, "loc_ghost": false }, "txt2": "Rest_all" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4769 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4775 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4769 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4780 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4784 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4788 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4769 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4788 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4754 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 97, "pos_bol": 4752, "pos_cnum": 4789 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Stop interpreting keywords and call the\n function with all remaining arguments ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 98, "pos_bol": 4790, "pos_cnum": 4821 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 99, "pos_bol": 4865, "pos_cnum": 4940 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 98, "pos_bol": 4790, "pos_cnum": 4821 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 99, "pos_bol": 4865, "pos_cnum": 4940 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 98, "pos_bol": 4790, "pos_cnum": 4821 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 99, "pos_bol": 4865, "pos_cnum": 4940 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 98, "pos_bol": 4790, "pos_cnum": 4821 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 99, "pos_bol": 4865, "pos_cnum": 4940 }, "loc_ghost": false } } ] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4945 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4951 }, "loc_ghost": false }, "txt2": "Expand" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4956 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4962 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4966 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4972 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4966 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4956 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4943 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4979 }, "loc_ghost": false }, "pcd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " If the remaining arguments to process\n are of the form\n [[\"-foo\"; \"arg\"] @ rest] where \"foo\"\n is registered as [Expand f], then the\n arguments [f \"arg\" @ rest] are\n processed. Only allowed in\n [parse_and_expand_argv_dynamic]. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4980 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 106, "pos_bol": 5386, "pos_cnum": 5464 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4980 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 106, "pos_bol": 5386, "pos_cnum": 5464 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4980 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 106, "pos_bol": 5386, "pos_cnum": 5464 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4980 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 106, "pos_bol": 5386, "pos_cnum": 5464 }, "loc_ghost": false } } ] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The concrete type describing the behavior associated\n with a keyword. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 107, "pos_bol": 5465, "pos_cnum": 5465 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 108, "pos_bol": 5522, "pos_cnum": 5543 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 107, "pos_bol": 5465, "pos_cnum": 5465 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 108, "pos_bol": 5522, "pos_cnum": 5543 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 107, "pos_bol": 5465, "pos_cnum": 5465 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 108, "pos_bol": 5522, "pos_cnum": 5543 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 107, "pos_bol": 5465, "pos_cnum": 5465 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 108, "pos_bol": 5522, "pos_cnum": 5543 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 79, "pos_bol": 3526, "pos_cnum": 3526 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4979 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 79, "pos_bol": 3526, "pos_cnum": 3526 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 100, "pos_bol": 4941, "pos_cnum": 4979 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5550 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5553 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5556 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5562 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5545 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5562 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5545 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 110, "pos_bol": 5545, "pos_cnum": 5562 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5568 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5571 }, "loc_ghost": false }, "txt2": "doc" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5574 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5580 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5563 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5580 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5563 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 111, "pos_bol": 5563, "pos_cnum": 5580 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5586 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5595 }, "loc_ghost": false }, "txt2": "usage_msg" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5598 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5604 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5581 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5604 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5581 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 112, "pos_bol": 5581, "pos_cnum": 5604 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5610 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5618 }, "loc_ghost": false }, "txt2": "anon_fun" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5622 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5628 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5632 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5636 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5622 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5636 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5605 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5637 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5605 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 113, "pos_bol": 5605, "pos_cnum": 5637 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 115, "pos_bol": 5639, "pos_cnum": 5643 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 115, "pos_bol": 5639, "pos_cnum": 5648 }, "loc_ghost": false }, "txt2": "parse" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5654 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5657 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5660 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5664 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5667 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5670 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5654 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5670 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5653 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5676 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "anon_fun", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5680 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5688 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "usage_msg", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5692 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5701 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5705 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5692 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5680 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5653 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Arg.parse speclist anon_fun usage_msg] parses the command line.\n [speclist] is a list of triples [(key, spec, doc)].\n [key] is the option keyword, it must start with a ['-'] character.\n [spec] gives the option type and the function to call when this option\n is found on the command line.\n [doc] is a one-line description of this option.\n [anon_fun] is called on anonymous arguments.\n The functions in [spec] and [anon_fun] are called in the same order\n as their arguments appear on the command line.\n\n If an error occurs, [Arg.parse] exits the program, after printing\n to standard error an error message as follows:\n- The reason for the error: unknown option, invalid or missing argument, etc.\n- [usage_msg]\n- The list of options, each followed by the corresponding [doc] string.\n Beware: options that have an empty [doc] string will not be included in the\n list.\n\n For the user to be able to specify anonymous arguments starting with a\n [-], include for example [(\"-\", String anon_fun, doc)] in [speclist].\n\n By default, [parse] recognizes two unit options, [-help] and [--help],\n which will print to standard output [usage_msg] and the list of\n options, and exit the program. You can override this behaviour\n by specifying your own [-help] and [--help] options in [speclist].\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 117, "pos_bol": 5710, "pos_cnum": 5710 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 142, "pos_bol": 7054, "pos_cnum": 7056 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 117, "pos_bol": 5710, "pos_cnum": 5710 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 142, "pos_bol": 7054, "pos_cnum": 7056 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 117, "pos_bol": 5710, "pos_cnum": 5710 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 142, "pos_bol": 7054, "pos_cnum": 7056 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 117, "pos_bol": 5710, "pos_cnum": 5710 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 142, "pos_bol": 7054, "pos_cnum": 7056 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 115, "pos_bol": 5639, "pos_cnum": 5639 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5709 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 115, "pos_bol": 5639, "pos_cnum": 5639 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 116, "pos_bol": 5651, "pos_cnum": 5709 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 144, "pos_bol": 7058, "pos_cnum": 7062 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 144, "pos_bol": 7058, "pos_cnum": 7075 }, "loc_ghost": false }, "txt2": "parse_dynamic" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7081 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7087 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7091 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7094 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7097 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7081 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7097 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7107 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "anon_fun", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7111 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7119 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "usage_msg", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7123 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7132 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7136 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7140 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7123 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7140 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7111 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7140 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7140 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Same as {!Arg.parse}, except that the [speclist] argument is a reference\n and may be updated during the parsing. A typical use for this feature\n is to parse command lines of the form:\n- command subcommand [options]\n where the list of options depends on the value of the subcommand argument.\n @since 4.01\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 146, "pos_bol": 7141, "pos_cnum": 7141 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 152, "pos_bol": 7465, "pos_cnum": 7467 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 146, "pos_bol": 7141, "pos_cnum": 7141 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 152, "pos_bol": 7465, "pos_cnum": 7467 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 146, "pos_bol": 7141, "pos_cnum": 7141 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 152, "pos_bol": 7465, "pos_cnum": 7467 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 146, "pos_bol": 7141, "pos_cnum": 7141 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 152, "pos_bol": 7465, "pos_cnum": 7467 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 144, "pos_bol": 7058, "pos_cnum": 7058 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7140 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 144, "pos_bol": 7058, "pos_cnum": 7058 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 145, "pos_bol": 7078, "pos_cnum": 7140 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7483 }, "loc_ghost": false }, "txt2": "parse_argv" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Optional", "current" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7496 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7499 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7496 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7503 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7507 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7513 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7507 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7519 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7526 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7529 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7532 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7536 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7539 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7526 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7525 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7548 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "anon_fun", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7552 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "usage_msg", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7564 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7573 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7577 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7564 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7552 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7525 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7507 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7486 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Arg.parse_argv ~current args speclist anon_fun usage_msg] parses\n the array [args] as if it were the command line. It uses and updates\n the value of [~current] (if given), or {!Arg.current}. You must set\n it before calling [parse_argv]. The initial value of [current]\n is the index of the program name (argument 0) in the array.\n If an error occurs, [Arg.parse_argv] raises {!Arg.Bad} with\n the error message as argument. If option [-help] or [--help] is\n given, [Arg.parse_argv] raises {!Arg.Help} with the help message\n as argument.\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 156, "pos_bol": 7582, "pos_cnum": 7582 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 165, "pos_bol": 8134, "pos_cnum": 8136 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 156, "pos_bol": 7582, "pos_cnum": 7582 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 165, "pos_bol": 8134, "pos_cnum": 8136 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 156, "pos_bol": 7582, "pos_cnum": 7582 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 165, "pos_bol": 8134, "pos_cnum": 8136 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 156, "pos_bol": 7582, "pos_cnum": 7582 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 165, "pos_bol": 8134, "pos_cnum": 8136 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7469 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 154, "pos_bol": 7469, "pos_cnum": 7469 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 155, "pos_bol": 7523, "pos_cnum": 7581 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8142 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8160 }, "loc_ghost": false }, "txt2": "parse_argv_dynamic" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Optional", "current" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8172 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8175 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8172 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8183 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8189 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8183 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8195 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8202 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8205 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8208 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8212 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8215 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8218 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8202 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8218 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8201 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8224 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8201 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8228 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "anon_fun", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8232 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8240 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8244 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8250 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8254 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8244 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8232 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8201 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8183 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8163 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Same as {!Arg.parse_argv}, except that the [speclist] argument is a\n reference and may be updated during the parsing.\n See {!Arg.parse_dynamic}.\n @since 4.01\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 169, "pos_bol": 8259, "pos_cnum": 8259 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 173, "pos_bol": 8430, "pos_cnum": 8432 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 169, "pos_bol": 8259, "pos_cnum": 8259 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 173, "pos_bol": 8430, "pos_cnum": 8432 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 169, "pos_bol": 8259, "pos_cnum": 8259 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 173, "pos_bol": 8430, "pos_cnum": 8432 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 169, "pos_bol": 8259, "pos_cnum": 8259 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 173, "pos_bol": 8430, "pos_cnum": 8432 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8138 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 167, "pos_bol": 8138, "pos_cnum": 8138 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 168, "pos_bol": 8199, "pos_cnum": 8258 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8438 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8467 }, "loc_ghost": false }, "txt2": "parse_and_expand_argv_dynamic" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8470 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8473 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8470 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8477 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8481 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8487 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8481 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8493 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8481 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8497 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8504 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8510 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8514 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8517 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8504 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8503 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8526 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8503 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8530 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "anon_fun", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8534 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8546 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8552 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8556 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8546 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8534 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8503 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8481 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8470 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Same as {!Arg.parse_argv_dynamic}, except that the [argv] argument is a\n reference and may be updated during the parsing of [Expand] arguments.\n See {!Arg.parse_argv_dynamic}.\n @since 4.05\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 177, "pos_bol": 8561, "pos_cnum": 8561 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 181, "pos_bol": 8763, "pos_cnum": 8765 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 177, "pos_bol": 8561, "pos_cnum": 8561 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 181, "pos_bol": 8763, "pos_cnum": 8765 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 177, "pos_bol": 8561, "pos_cnum": 8561 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 181, "pos_bol": 8763, "pos_cnum": 8765 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 177, "pos_bol": 8561, "pos_cnum": 8561 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 181, "pos_bol": 8763, "pos_cnum": 8765 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8434 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 175, "pos_bol": 8434, "pos_cnum": 8434 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 176, "pos_bol": 8501, "pos_cnum": 8560 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 183, "pos_bol": 8767, "pos_cnum": 8771 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 183, "pos_bol": 8767, "pos_cnum": 8783 }, "loc_ghost": false }, "txt2": "parse_expand" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8788 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8791 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8794 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8798 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8801 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8788 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8787 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8810 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "anon_fun", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8814 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8822 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "usage_msg", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8826 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8835 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8839 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8843 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8826 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8843 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8814 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8843 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8787 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8843 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Same as {!Arg.parse}, except that the [Expand] arguments are allowed and\n the {!current} reference is not updated.\n @since 4.05\n", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 185, "pos_bol": 8844, "pos_cnum": 8844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 188, "pos_bol": 8982, "pos_cnum": 8984 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 185, "pos_bol": 8844, "pos_cnum": 8844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 188, "pos_bol": 8982, "pos_cnum": 8984 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 185, "pos_bol": 8844, "pos_cnum": 8844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 188, "pos_bol": 8982, "pos_cnum": 8984 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 185, "pos_bol": 8844, "pos_cnum": 8844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 188, "pos_bol": 8982, "pos_cnum": 8984 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 183, "pos_bol": 8767, "pos_cnum": 8767 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8843 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 183, "pos_bol": 8767, "pos_cnum": 8767 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 184, "pos_bol": 8785, "pos_cnum": 8843 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_exception", { "ptyexn_constructor": { "pext_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 8996 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 9000 }, "loc_ghost": false }, "txt2": "Help" }, "pext_kind": [ "Pext_decl", [], [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 9004 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 9010 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], null ], "pext_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 8986 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 9010 }, "loc_ghost": false }, "pext_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Raised by [Arg.parse_argv] when the user asks for help. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9011 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9073 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9011 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9073 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9011 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9073 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9011 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 191, "pos_bol": 9011, "pos_cnum": 9073 }, "loc_ghost": false } } ] }, "ptyexn_loc": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "ptyexn_attributes": [] } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 8986 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 190, "pos_bol": 8986, "pos_cnum": 9010 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_exception", { "ptyexn_constructor": { "pext_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9085 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9088 }, "loc_ghost": false }, "txt2": "Bad" }, "pext_kind": [ "Pext_decl", [], [ "Pcstr_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9092 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9098 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], null ], "pext_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9075 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9098 }, "loc_ghost": false }, "pext_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Functions in [spec] or [anon_fun] can raise [Arg.Bad] with an error\n message to reject invalid arguments.\n [Arg.Bad] is also raised by {!Arg.parse_argv} in case of an error. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 194, "pos_bol": 9099, "pos_cnum": 9099 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 196, "pos_bol": 9212, "pos_cnum": 9285 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 194, "pos_bol": 9099, "pos_cnum": 9099 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 196, "pos_bol": 9212, "pos_cnum": 9285 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 194, "pos_bol": 9099, "pos_cnum": 9099 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 196, "pos_bol": 9212, "pos_cnum": 9285 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 194, "pos_bol": 9099, "pos_cnum": 9099 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 196, "pos_bol": 9212, "pos_cnum": 9285 }, "loc_ghost": false } } ] }, "ptyexn_loc": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "ptyexn_attributes": [] } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9075 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 193, "pos_bol": 9075, "pos_cnum": 9098 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9291 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9296 }, "loc_ghost": false }, "txt2": "usage" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9300 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9306 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9310 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9313 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9316 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9300 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9316 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9299 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9322 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "usage_msg", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9326 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9335 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9339 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9326 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9299 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Arg.usage speclist usage_msg] prints to standard error\n an error message that includes the list of valid options. This is\n the same message that {!Arg.parse} prints in case of error.\n [speclist] and [usage_msg] are the same as for {!Arg.parse}. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 199, "pos_bol": 9344, "pos_cnum": 9344 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 202, "pos_bol": 9539, "pos_cnum": 9606 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 199, "pos_bol": 9344, "pos_cnum": 9344 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 202, "pos_bol": 9539, "pos_cnum": 9606 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 199, "pos_bol": 9344, "pos_cnum": 9344 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 202, "pos_bol": 9539, "pos_cnum": 9606 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 199, "pos_bol": 9344, "pos_cnum": 9344 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 202, "pos_bol": 9539, "pos_cnum": 9606 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9287 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9343 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9287 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 198, "pos_bol": 9287, "pos_cnum": 9343 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9612 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9624 }, "loc_ghost": false }, "txt2": "usage_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9628 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9631 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9634 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9638 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9641 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9644 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9628 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9644 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9627 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9650 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "usage_msg", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9654 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9663 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9667 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9673 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9654 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9673 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9627 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9673 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Returns the message that would have been printed by {!Arg.usage},\n if provided with the same parameters. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 205, "pos_bol": 9674, "pos_cnum": 9674 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 206, "pos_bol": 9744, "pos_cnum": 9788 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 205, "pos_bol": 9674, "pos_cnum": 9674 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 206, "pos_bol": 9744, "pos_cnum": 9788 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 205, "pos_bol": 9674, "pos_cnum": 9674 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 206, "pos_bol": 9744, "pos_cnum": 9788 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 205, "pos_bol": 9674, "pos_cnum": 9674 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 206, "pos_bol": 9744, "pos_cnum": 9788 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9608 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9673 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9608 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 204, "pos_bol": 9608, "pos_cnum": 9673 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9794 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9799 }, "loc_ghost": false }, "txt2": "align" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Optional", "limit" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9809 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9812 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9817 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9820 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9823 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9827 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9830 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9833 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9817 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9833 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9816 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9839 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "spec", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9850 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9854 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "doc", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9857 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9860 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9860 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9843 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9866 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9816 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9866 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9801 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9866 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Align the documentation strings by inserting spaces at the first alignment\n separator (tab or, if tab is not found, space), according to the length of\n the keyword. Use a alignment separator as the first character in a doc\n string if you want to align the whole string. The doc strings corresponding\n to [Symbol] arguments are aligned on the next line.\n @param limit options with keyword and message longer than [limit] will not\n be used to compute the alignment. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 209, "pos_bol": 9867, "pos_cnum": 9867 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 215, "pos_bol": 10317, "pos_cnum": 10357 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 209, "pos_bol": 9867, "pos_cnum": 9867 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 215, "pos_bol": 10317, "pos_cnum": 10357 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 209, "pos_bol": 9867, "pos_cnum": 9867 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 215, "pos_bol": 10317, "pos_cnum": 10357 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 209, "pos_bol": 9867, "pos_cnum": 9867 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 215, "pos_bol": 10317, "pos_cnum": 10357 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9790 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9866 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9790 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 208, "pos_bol": 9790, "pos_cnum": 9866 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10363 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10370 }, "loc_ghost": false }, "txt2": "current" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "ref", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10373 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10376 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10373 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10380 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Position (in {!Sys.argv}) of the argument being processed. You can\n change this value, e.g. to force {!Arg.parse} to skip some arguments.\n {!Arg.parse} uses the initial value of {!Arg.current} as the index of\n argument 0 (the program name) and starts parsing arguments\n at the next element. ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 218, "pos_bol": 10381, "pos_cnum": 10381 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 222, "pos_bol": 10664, "pos_cnum": 10691 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 218, "pos_bol": 10381, "pos_cnum": 10381 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 222, "pos_bol": 10664, "pos_cnum": 10691 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 218, "pos_bol": 10381, "pos_cnum": 10381 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 222, "pos_bol": 10664, "pos_cnum": 10691 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 218, "pos_bol": 10381, "pos_cnum": 10381 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 222, "pos_bol": 10664, "pos_cnum": 10691 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10359 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10380 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10359 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 217, "pos_bol": 10359, "pos_cnum": 10380 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10697 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10705 }, "loc_ghost": false }, "txt2": "read_arg" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10707 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10713 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10717 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10723 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10717 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10729 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10707 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10729 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Arg.read_arg file] reads newline-terminated command line arguments from\n file [file].\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 225, "pos_bol": 10730, "pos_cnum": 10730 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 227, "pos_bol": 10824, "pos_cnum": 10842 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 225, "pos_bol": 10730, "pos_cnum": 10730 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 227, "pos_bol": 10824, "pos_cnum": 10842 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 225, "pos_bol": 10730, "pos_cnum": 10730 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 227, "pos_bol": 10824, "pos_cnum": 10842 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 225, "pos_bol": 10730, "pos_cnum": 10730 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 227, "pos_bol": 10824, "pos_cnum": 10842 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10693 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10729 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10693 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 224, "pos_bol": 10693, "pos_cnum": 10729 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10848 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10857 }, "loc_ghost": false }, "txt2": "read_arg0" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10859 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10865 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10869 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10875 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10869 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10881 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10859 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10881 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Identical to {!Arg.read_arg} but assumes null character terminated command\n line arguments.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 230, "pos_bol": 10882, "pos_cnum": 10882 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 232, "pos_bol": 10981, "pos_cnum": 10999 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 230, "pos_bol": 10882, "pos_cnum": 10882 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 232, "pos_bol": 10981, "pos_cnum": 10999 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 230, "pos_bol": 10882, "pos_cnum": 10882 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 232, "pos_bol": 10981, "pos_cnum": 10999 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 230, "pos_bol": 10882, "pos_cnum": 10882 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 232, "pos_bol": 10981, "pos_cnum": 10999 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10881 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10844 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 229, "pos_bol": 10844, "pos_cnum": 10881 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11006 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11015 }, "loc_ghost": false }, "txt2": "write_arg" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11017 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11023 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11027 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11027 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11039 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11043 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11047 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11027 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11047 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11017 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11047 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Arg.write_arg file args] writes the arguments [args] newline-terminated\n into the file [file]. If any of the arguments in [args] contains a\n newline, use {!Arg.write_arg0} instead.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 236, "pos_bol": 11048, "pos_cnum": 11048 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 239, "pos_bol": 11240, "pos_cnum": 11258 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 236, "pos_bol": 11048, "pos_cnum": 11048 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 239, "pos_bol": 11240, "pos_cnum": 11258 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 236, "pos_bol": 11048, "pos_cnum": 11048 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 239, "pos_bol": 11240, "pos_cnum": 11258 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 236, "pos_bol": 11048, "pos_cnum": 11048 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 239, "pos_bol": 11240, "pos_cnum": 11258 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11002 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11047 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11002 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 235, "pos_bol": 11002, "pos_cnum": 11047 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11264 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11274 }, "loc_ghost": false }, "txt2": "write_arg0" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11276 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11282 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11286 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11292 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11286 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11298 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11302 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11306 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11286 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11306 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11276 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11306 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Identical to {!Arg.write_arg} but uses the null character for terminator\n instead of newline.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 242, "pos_bol": 11307, "pos_cnum": 11307 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 244, "pos_bol": 11408, "pos_cnum": 11426 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 242, "pos_bol": 11307, "pos_cnum": 11307 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 244, "pos_bol": 11408, "pos_cnum": 11426 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 242, "pos_bol": 11307, "pos_cnum": 11307 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 244, "pos_bol": 11408, "pos_cnum": 11426 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 242, "pos_bol": 11307, "pos_cnum": 11307 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 244, "pos_bol": 11408, "pos_cnum": 11426 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11260 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11306 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11260 }, "loc_end": { "pos_fname": "./stdlib/arg.mli", "pos_lnum": 241, "pos_bol": 11260, "pos_cnum": 11306 }, "loc_ghost": false } } ]