[ { "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", " Dynamic arrays.\n\n The {!Array} module provide arrays of fixed length. {!Dynarray}\n provides arrays whose length can change over time, by adding or\n removing elements at the end of the array.\n\n This is typically used to accumulate elements whose number is not\n known in advance or changes during computation, while also\n providing fast access to elements at arbitrary indices.\n\n{[\n let dynarray_of_list li =\n let arr = Dynarray.create () in\n List.iter (fun v -> Dynarray.add_last arr v) li;\n arr\n]}\n\n The {!Buffer} module provides similar features, but it is\n specialized for accumulating characters into a dynamically-resized\n string.\n\n The {!Stack} module provides a last-in first-out data structure\n that can be easily implemented on top of dynamic arrays.\n\n @since 5.2\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 18, "pos_bol": 1233, "pos_cnum": 1233 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 43, "pos_bol": 2063, "pos_cnum": 2065 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 18, "pos_bol": 1233, "pos_cnum": 1233 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 43, "pos_bol": 2063, "pos_cnum": 2065 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 18, "pos_bol": 1233, "pos_cnum": 1233 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 43, "pos_bol": 2063, "pos_cnum": 2065 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 18, "pos_bol": 1233, "pos_cnum": 1233 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 43, "pos_bol": 2063, "pos_cnum": 2065 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 18, "pos_bol": 1233, "pos_cnum": 1233 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 43, "pos_bol": 2063, "pos_cnum": 2065 }, "loc_ghost": false } }, { "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", " {b Unsynchronized accesses} ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2101 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2101 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2101 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2101 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 45, "pos_bol": 2067, "pos_cnum": 2101 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2107 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2112 }, "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/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2134 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [ [ [ "Nolabel" ], { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", "Unsynchronized accesses to dynamic arrays are a programming error.", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 48, "pos_bol": 2135, "pos_cnum": 2140 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 48, "pos_bol": 2135, "pos_cnum": 2206 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 48, "pos_bol": 2135, "pos_cnum": 2139 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 48, "pos_bol": 2135, "pos_cnum": 2207 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] } ] ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 48, "pos_bol": 2135, "pos_cnum": 2207 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 48, "pos_bol": 2135, "pos_cnum": 2207 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2103 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 49, "pos_bol": 2208, "pos_cnum": 2209 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 47, "pos_bol": 2103, "pos_cnum": 2103 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 49, "pos_bol": 2208, "pos_cnum": 2209 }, "loc_ghost": false } }, { "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", "\n Concurrent accesses to dynamic arrays must be synchronized\n (for instance with a {!Mutex.t}). Unsynchronized accesses to\n a dynamic array are a programming error that may lead to an invalid\n dynamic array state, on which some operations would fail with an\n [Invalid_argument] exception.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 51, "pos_bol": 2211, "pos_cnum": 2211 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 57, "pos_bol": 2513, "pos_cnum": 2515 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 51, "pos_bol": 2211, "pos_cnum": 2211 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 57, "pos_bol": 2513, "pos_cnum": 2515 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 51, "pos_bol": 2211, "pos_cnum": 2211 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 57, "pos_bol": 2513, "pos_cnum": 2515 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 51, "pos_bol": 2211, "pos_cnum": 2211 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 57, "pos_bol": 2513, "pos_cnum": 2515 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 51, "pos_bol": 2211, "pos_cnum": 2211 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 57, "pos_bol": 2513, "pos_cnum": 2515 }, "loc_ghost": false } }, { "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", " {1:dynarrays Dynamic arrays} ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2517 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2552 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2517 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2552 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2517 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2552 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2517 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2552 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2517 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 59, "pos_bol": 2517, "pos_cnum": 2552 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2563 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2564 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2560 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2562 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "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", " A dynamic array containing values of type ['a].\n\n A dynamic array [a] provides constant-time [get] and [set]\n operations on indices between [0] and [Dynarray.length a - 1]\n included. Its {!length} may change over time by adding or removing\n elements to the end of the array.\n\n We say that an index into a dynarray [a] is valid if it is in\n [0 .. length a - 1] and invalid otherwise.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 62, "pos_bol": 2565, "pos_cnum": 2565 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 71, "pos_bol": 2970, "pos_cnum": 2972 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 62, "pos_bol": 2565, "pos_cnum": 2565 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 71, "pos_bol": 2970, "pos_cnum": 2972 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 62, "pos_bol": 2565, "pos_cnum": 2565 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 71, "pos_bol": 2970, "pos_cnum": 2972 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 62, "pos_bol": 2565, "pos_cnum": 2565 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 71, "pos_bol": 2970, "pos_cnum": 2972 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2554 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2564 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2554 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 61, "pos_bol": 2554, "pos_cnum": 2564 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2978 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2984 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2987 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2991 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2995 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2997 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2995 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2999 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2987 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2999 }, "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", " [create ()] is a new, empty array. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3000 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3041 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3000 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3041 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3000 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3041 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3000 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 74, "pos_bol": 3000, "pos_cnum": 3041 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2974 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2999 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2974 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 73, "pos_bol": 2974, "pos_cnum": 2999 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3047 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3051 }, "loc_ghost": false }, "txt2": "make" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3054 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3057 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3061 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3063 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3069 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3067 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3071 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3061 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3071 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3054 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3071 }, "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", " [make n x] is a new array of length [n], filled with [x].\n\n @raise Invalid_argument if [n < 0] or [n > Sys.max_array_length].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 77, "pos_bol": 3072, "pos_cnum": 3072 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 80, "pos_bol": 3205, "pos_cnum": 3207 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 77, "pos_bol": 3072, "pos_cnum": 3072 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 80, "pos_bol": 3205, "pos_cnum": 3207 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 77, "pos_bol": 3072, "pos_cnum": 3072 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 80, "pos_bol": 3205, "pos_cnum": 3207 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 77, "pos_bol": 3072, "pos_cnum": 3072 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 80, "pos_bol": 3205, "pos_cnum": 3207 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3043 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3071 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3043 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 76, "pos_bol": 3043, "pos_cnum": 3071 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3213 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3217 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3220 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3228 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3231 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3235 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3228 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3242 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3244 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3242 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3227 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3220 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3246 }, "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", " [init n f] is a new array [a] of length [n],\n such that [get a i] is [f i]. In other words,\n the elements of [a] are [f 0], then [f 1],\n then [f 2]... and [f (n - 1)] last, evaluated\n in that order.\n\n This is similar to {!Array.init}.\n\n @raise Invalid_argument if [n < 0] or [n > Sys.max_array_length].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 83, "pos_bol": 3247, "pos_cnum": 3247 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 92, "pos_bol": 3572, "pos_cnum": 3574 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 83, "pos_bol": 3247, "pos_cnum": 3247 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 92, "pos_bol": 3572, "pos_cnum": 3574 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 83, "pos_bol": 3247, "pos_cnum": 3247 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 92, "pos_bol": 3572, "pos_cnum": 3574 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 83, "pos_bol": 3247, "pos_cnum": 3247 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 92, "pos_bol": 3572, "pos_cnum": 3574 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3209 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3246 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3209 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 82, "pos_bol": 3209, "pos_cnum": 3246 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3580 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3583 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3586 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3588 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3586 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3590 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3594 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3597 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3601 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3603 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3594 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3603 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3586 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3603 }, "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", " [get a i] is the [i]-th element of [a], starting with index [0].\n\n @raise Invalid_argument if the index is invalid ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 95, "pos_bol": 3604, "pos_cnum": 3604 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 97, "pos_bol": 3674, "pos_cnum": 3728 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 95, "pos_bol": 3604, "pos_cnum": 3604 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 97, "pos_bol": 3674, "pos_cnum": 3728 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 95, "pos_bol": 3604, "pos_cnum": 3604 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 97, "pos_bol": 3674, "pos_cnum": 3728 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 95, "pos_bol": 3604, "pos_cnum": 3604 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 97, "pos_bol": 3674, "pos_cnum": 3728 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3576 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3603 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3576 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 94, "pos_bol": 3576, "pos_cnum": 3603 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3734 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3737 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3740 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3740 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3744 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3748 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3751 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3755 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3757 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3761 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3755 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3748 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3740 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3765 }, "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", " [set a i x] sets the [i]-th element of [a] to be [x].\n\n [i] must be a valid index. [set] does not add new elements to the\n array -- see {!add_last} to add an element.\n\n @raise Invalid_argument if the index is invalid. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 100, "pos_bol": 3766, "pos_cnum": 3766 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 105, "pos_bol": 3944, "pos_cnum": 3999 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 100, "pos_bol": 3766, "pos_cnum": 3766 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 105, "pos_bol": 3944, "pos_cnum": 3999 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 100, "pos_bol": 3766, "pos_cnum": 3766 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 105, "pos_bol": 3944, "pos_cnum": 3999 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 100, "pos_bol": 3766, "pos_cnum": 3766 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 105, "pos_bol": 3944, "pos_cnum": 3999 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3730 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3765 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3730 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 99, "pos_bol": 3730, "pos_cnum": 3765 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4005 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4011 }, "loc_ghost": false }, "txt2": "length" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4014 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4016 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4014 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4018 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4022 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4025 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4014 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4025 }, "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", " [length a] is the number of elements in the array. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4083 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4083 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4083 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 108, "pos_bol": 4026, "pos_cnum": 4083 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4001 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4025 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4001 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 107, "pos_bol": 4001, "pos_cnum": 4025 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4089 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4097 }, "loc_ghost": false }, "txt2": "is_empty" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4100 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4102 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4100 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4104 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4108 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4112 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4100 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4112 }, "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", " [is_empty a] is [true] if [a] is empty, that is, if [length a = 0]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4187 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4187 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4187 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 111, "pos_bol": 4113, "pos_cnum": 4187 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4085 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4112 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4085 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 110, "pos_bol": 4085, "pos_cnum": 4112 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4193 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4201 }, "loc_ghost": false }, "txt2": "get_last" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4204 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4204 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4208 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4212 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4214 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4204 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4214 }, "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", " [get_last a] is the element of [a] at index [length a - 1].\n\n @raise Invalid_argument if [a] is empty.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 114, "pos_bol": 4215, "pos_cnum": 4215 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 117, "pos_bol": 4325, "pos_cnum": 4327 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 114, "pos_bol": 4215, "pos_cnum": 4215 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 117, "pos_bol": 4325, "pos_cnum": 4327 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 114, "pos_bol": 4215, "pos_cnum": 4215 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 117, "pos_bol": 4325, "pos_cnum": 4327 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 114, "pos_bol": 4215, "pos_cnum": 4215 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 117, "pos_bol": 4325, "pos_cnum": 4327 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4189 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4214 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4189 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 113, "pos_bol": 4189, "pos_cnum": 4214 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4333 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4342 }, "loc_ghost": false }, "txt2": "find_last" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4345 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4347 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4345 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4349 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4353 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4355 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4353 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4362 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4345 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4362 }, "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", " [find_last a] is [None] if [a] is empty\n and [Some (get_last a)] otherwise. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 120, "pos_bol": 4363, "pos_cnum": 4363 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 121, "pos_bol": 4407, "pos_cnum": 4448 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 120, "pos_bol": 4363, "pos_cnum": 4363 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 121, "pos_bol": 4407, "pos_cnum": 4448 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 120, "pos_bol": 4363, "pos_cnum": 4363 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 121, "pos_bol": 4407, "pos_cnum": 4448 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 120, "pos_bol": 4363, "pos_cnum": 4363 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 121, "pos_bol": 4407, "pos_cnum": 4448 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4329 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4362 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4329 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 119, "pos_bol": 4329, "pos_cnum": 4362 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4454 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4458 }, "loc_ghost": false }, "txt2": "copy" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4461 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4461 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4465 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4469 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4471 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4469 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4473 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4461 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4473 }, "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", " [copy a] is a shallow copy of [a], a new array\n containing the same elements as [a]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 124, "pos_bol": 4474, "pos_cnum": 4474 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 125, "pos_bol": 4525, "pos_cnum": 4568 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 124, "pos_bol": 4474, "pos_cnum": 4474 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 125, "pos_bol": 4525, "pos_cnum": 4568 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 124, "pos_bol": 4474, "pos_cnum": 4474 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 125, "pos_bol": 4525, "pos_cnum": 4568 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 124, "pos_bol": 4474, "pos_cnum": 4474 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 125, "pos_bol": 4525, "pos_cnum": 4568 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4450 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4473 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4450 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 123, "pos_bol": 4450, "pos_cnum": 4473 }, "loc_ghost": false } }, { "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", " {1:adding Adding elements}\n\n Note: all operations adding elements raise [Invalid_argument] if the\n length needs to grow beyond {!Sys.max_array_length}. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 127, "pos_bol": 4570, "pos_cnum": 4570 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 130, "pos_bol": 4675, "pos_cnum": 4734 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 127, "pos_bol": 4570, "pos_cnum": 4570 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 130, "pos_bol": 4675, "pos_cnum": 4734 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 127, "pos_bol": 4570, "pos_cnum": 4570 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 130, "pos_bol": 4675, "pos_cnum": 4734 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 127, "pos_bol": 4570, "pos_cnum": 4570 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 130, "pos_bol": 4675, "pos_cnum": 4734 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 127, "pos_bol": 4570, "pos_cnum": 4570 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 130, "pos_bol": 4675, "pos_cnum": 4734 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4740 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4748 }, "loc_ghost": false }, "txt2": "add_last" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4751 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4753 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4751 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4755 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4759 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4761 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4765 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4769 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4759 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4769 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4751 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4769 }, "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", " [add_last a x] adds the element [x] at the end of the array [a]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4770 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4841 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4770 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4841 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4770 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4841 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4770 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 133, "pos_bol": 4770, "pos_cnum": 4841 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4736 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4769 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4736 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 132, "pos_bol": 4736, "pos_cnum": 4769 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4847 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4859 }, "loc_ghost": false }, "txt2": "append_array" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4866 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4870 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4870 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4878 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4882 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4886 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4870 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4886 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4886 }, "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", " [append_array a b] adds all elements of [b] at the end of [a],\n in the order they appear in [b].\n\n For example:\n {[\n let a = Dynarray.of_list [1;2] in\n Dynarray.append_array a [|3; 4|];\n assert (Dynarray.to_list a = [1; 2; 3; 4])\n ]}\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 136, "pos_bol": 4887, "pos_cnum": 4887 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 145, "pos_bol": 5152, "pos_cnum": 5154 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 136, "pos_bol": 4887, "pos_cnum": 4887 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 145, "pos_bol": 5152, "pos_cnum": 5154 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 136, "pos_bol": 4887, "pos_cnum": 4887 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 145, "pos_bol": 5152, "pos_cnum": 5154 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 136, "pos_bol": 4887, "pos_cnum": 4887 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 145, "pos_bol": 5152, "pos_cnum": 5154 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4843 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4886 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4843 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 135, "pos_bol": 4843, "pos_cnum": 4886 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5160 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5171 }, "loc_ghost": false }, "txt2": "append_list" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5174 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5174 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5178 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5182 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5184 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5182 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5189 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5193 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5197 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5182 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5197 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5174 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5197 }, "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", " Like {!append_array} but with a list. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5198 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5242 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5198 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5242 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5198 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5242 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5198 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 148, "pos_bol": 5198, "pos_cnum": 5242 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5156 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5197 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5156 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 147, "pos_bol": 5156, "pos_cnum": 5197 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5248 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5254 }, "loc_ghost": false }, "txt2": "append" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5257 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5259 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5257 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5261 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5265 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5267 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5265 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5269 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5273 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5277 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5265 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5277 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5257 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5277 }, "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", " [append a b] is like [append_array a b],\n but [b] is itself a dynamic array instead of a fixed-size array.\n\n Warning: [append a a] is a programming error because it iterates\n on [a] and adds elements to it at the same time -- see the\n {{!section:iteration} Iteration} section below. It fails with\n [Invalid_argument].\n If you really want to append a copy of [a] to itself, you can use\n [Dynarray.append_array a (Dynarray.to_array a)] which copies [a]\n into a temporary array.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 151, "pos_bol": 5278, "pos_cnum": 5278 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 161, "pos_bol": 5782, "pos_cnum": 5784 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 151, "pos_bol": 5278, "pos_cnum": 5278 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 161, "pos_bol": 5782, "pos_cnum": 5784 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 151, "pos_bol": 5278, "pos_cnum": 5278 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 161, "pos_bol": 5782, "pos_cnum": 5784 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 151, "pos_bol": 5278, "pos_cnum": 5278 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 161, "pos_bol": 5782, "pos_cnum": 5784 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5244 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5277 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5244 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 150, "pos_bol": 5244, "pos_cnum": 5277 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5790 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5800 }, "loc_ghost": false }, "txt2": "append_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5803 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5803 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5807 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5811 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5813 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5811 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5819 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5823 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5827 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5811 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5827 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5803 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5827 }, "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", " Like {!append_array} but with a sequence.\n\n Warning: [append_seq a (to_seq_reentrant a)] simultaneously\n traverses [a] and adds element to it; the ordering of those\n operations is unspecified, and may result in an infinite loop --\n the new elements may in turn be produced by [to_seq_reentrant a]\n and get added again and again.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 164, "pos_bol": 5828, "pos_cnum": 5828 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 171, "pos_bol": 6176, "pos_cnum": 6178 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 164, "pos_bol": 5828, "pos_cnum": 5828 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 171, "pos_bol": 6176, "pos_cnum": 6178 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 164, "pos_bol": 5828, "pos_cnum": 5828 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 171, "pos_bol": 6176, "pos_cnum": 6178 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 164, "pos_bol": 5828, "pos_cnum": 5828 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 171, "pos_bol": 6176, "pos_cnum": 6178 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5786 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5827 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5786 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 163, "pos_bol": 5786, "pos_cnum": 5827 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 173, "pos_bol": 6180, "pos_cnum": 6184 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 173, "pos_bol": 6180, "pos_cnum": 6195 }, "loc_ghost": false }, "txt2": "append_iter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 174, "pos_bol": 6198, "pos_cnum": 6200 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 174, "pos_bol": 6198, "pos_cnum": 6202 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 174, "pos_bol": 6198, "pos_cnum": 6200 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 174, "pos_bol": 6198, "pos_cnum": 6204 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6212 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6214 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6218 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6222 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6212 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6222 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "x" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6227 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6229 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6233 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6227 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6211 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "x" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6244 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6250 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6254 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6244 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6254 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 175, "pos_bol": 6208, "pos_cnum": 6210 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6254 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 174, "pos_bol": 6198, "pos_cnum": 6200 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6254 }, "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", " [append_iter a iter x] adds each element of [x] to the end of [a].\n This is [iter (add_last a) x].\n\n For example, [append_iter a List.iter [1;2;3]] would add elements\n [1], [2], and then [3] at the end of [a].\n [append_iter a Queue.iter q] adds elements from the queue [q]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 177, "pos_bol": 6255, "pos_cnum": 6255 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 182, "pos_bol": 6478, "pos_cnum": 6547 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 177, "pos_bol": 6255, "pos_cnum": 6255 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 182, "pos_bol": 6478, "pos_cnum": 6547 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 177, "pos_bol": 6255, "pos_cnum": 6255 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 182, "pos_bol": 6478, "pos_cnum": 6547 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 177, "pos_bol": 6255, "pos_cnum": 6255 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 182, "pos_bol": 6478, "pos_cnum": 6547 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 173, "pos_bol": 6180, "pos_cnum": 6180 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6254 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 173, "pos_bol": 6180, "pos_cnum": 6180 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 176, "pos_bol": 6242, "pos_cnum": 6254 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6553 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6557 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6564 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6566 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6564 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6568 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6580 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6583 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6591 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6593 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6591 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6595 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6607 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6610 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6618 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6621 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6625 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6614 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6599 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6587 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6572 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6560 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "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", " [blit ~src ~src_pos ~dst ~dst_pos ~len] copies [len] elements from\n a source dynarray [src], starting at index [src_pos], to\n a destination dynarray [dst], starting at index [dst_pos]. It\n works correctly even if [src] and [dst] are the same array, and\n the source and destination chunks overlap.\n\n Unlike {!Array.blit}, {!Dynarray.blit} can extend the destination\n array with new elements: it is valid to call [blit] even when\n [dst_pos + len] is larger than [length dst]. The only requirement\n is that [dst_pos] must be at most [length dst] (included), so that\n there is no gap between the current elements and the blit\n region.\n\n @raise Invalid_argument if [src_pos] and [len] do not designate\n a valid subarray of [src], or if [dst_pos] is strictly below [0]\n or strictly above [length dst]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 185, "pos_bol": 6630, "pos_cnum": 6630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 200, "pos_bol": 7433, "pos_cnum": 7471 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 185, "pos_bol": 6630, "pos_cnum": 6630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 200, "pos_bol": 7433, "pos_cnum": 7471 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 185, "pos_bol": 6630, "pos_cnum": 6630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 200, "pos_bol": 7433, "pos_cnum": 7471 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 185, "pos_bol": 6630, "pos_cnum": 6630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 200, "pos_bol": 7433, "pos_cnum": 7471 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 184, "pos_bol": 6549, "pos_cnum": 6629 }, "loc_ghost": false } }, { "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", " {1:removing Removing elements} ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7510 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7510 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7510 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7510 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 202, "pos_bol": 7473, "pos_cnum": 7510 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7516 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7528 }, "loc_ghost": false }, "txt2": "pop_last_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7531 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7531 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7535 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7539 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7539 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7548 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7531 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7548 }, "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", " [pop_last_opt a] removes and returns the last element of [a],\n or [None] if the array is empty. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 205, "pos_bol": 7549, "pos_cnum": 7549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 206, "pos_bol": 7615, "pos_cnum": 7654 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 205, "pos_bol": 7549, "pos_cnum": 7549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 206, "pos_bol": 7615, "pos_cnum": 7654 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 205, "pos_bol": 7549, "pos_cnum": 7549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 206, "pos_bol": 7615, "pos_cnum": 7654 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 205, "pos_bol": 7549, "pos_cnum": 7549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 206, "pos_bol": 7615, "pos_cnum": 7654 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7512 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7548 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7512 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 204, "pos_bol": 7512, "pos_cnum": 7548 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7660 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7668 }, "loc_ghost": false }, "txt2": "pop_last" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7671 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7673 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7671 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7675 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7679 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7681 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7671 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7681 }, "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", " [pop_last a] removes and returns the last element of [a].\n\n @raise Not_found on an empty array. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 209, "pos_bol": 7682, "pos_cnum": 7682 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 211, "pos_bol": 7745, "pos_cnum": 7787 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 209, "pos_bol": 7682, "pos_cnum": 7682 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 211, "pos_bol": 7745, "pos_cnum": 7787 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 209, "pos_bol": 7682, "pos_cnum": 7682 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 211, "pos_bol": 7745, "pos_cnum": 7787 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 209, "pos_bol": 7682, "pos_cnum": 7682 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 211, "pos_bol": 7745, "pos_cnum": 7787 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7656 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7681 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7656 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 208, "pos_bol": 7656, "pos_cnum": 7681 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7793 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7804 }, "loc_ghost": false }, "txt2": "remove_last" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7807 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7809 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7807 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7811 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7815 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7819 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7807 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7819 }, "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", " [remove_last a] removes the last element of [a], if any.\n It does nothing if [a] is empty. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 214, "pos_bol": 7820, "pos_cnum": 7820 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 215, "pos_bol": 7881, "pos_cnum": 7920 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 214, "pos_bol": 7820, "pos_cnum": 7820 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 215, "pos_bol": 7881, "pos_cnum": 7920 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 214, "pos_bol": 7820, "pos_cnum": 7820 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 215, "pos_bol": 7881, "pos_cnum": 7920 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 214, "pos_bol": 7820, "pos_cnum": 7820 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 215, "pos_bol": 7881, "pos_cnum": 7920 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7789 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7819 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7789 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 213, "pos_bol": 7789, "pos_cnum": 7819 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7926 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7934 }, "loc_ghost": false }, "txt2": "truncate" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7937 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7939 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7937 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7941 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7945 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7948 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7952 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7956 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7945 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7956 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7937 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7956 }, "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", " [truncate a n] truncates [a] to have at most [n] elements.\n\n It removes elements whose index is greater or equal to [n].\n It does nothing if [n >= length a].\n\n [truncate a n] is equivalent to:\n {[\n if n < 0 then invalid_argument \"...\";\n while length a > n do\n remove_last a\n done\n ]}\n\n @raise Invalid_argument if [n < 0].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 218, "pos_bol": 7957, "pos_cnum": 7957 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 232, "pos_bol": 8323, "pos_cnum": 8325 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 218, "pos_bol": 7957, "pos_cnum": 7957 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 232, "pos_bol": 8323, "pos_cnum": 8325 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 218, "pos_bol": 7957, "pos_cnum": 7957 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 232, "pos_bol": 8323, "pos_cnum": 8325 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 218, "pos_bol": 7957, "pos_cnum": 7957 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 232, "pos_bol": 8323, "pos_cnum": 8325 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7956 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 217, "pos_bol": 7922, "pos_cnum": 7956 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8331 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8336 }, "loc_ghost": false }, "txt2": "clear" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8339 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8341 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8339 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8347 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8351 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8339 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8351 }, "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", " [clear a] is [truncate a 0], it removes all the elements of [a]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8352 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8423 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8352 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8423 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8352 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8423 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8352 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 235, "pos_bol": 8352, "pos_cnum": 8423 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8327 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8351 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8327 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 234, "pos_bol": 8327, "pos_cnum": 8351 }, "loc_ghost": false } }, { "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", " {1:iteration Iteration}\n\n The iteration functions traverse the elements of a dynamic array.\n Traversals of [a] are computed in increasing index order: from\n the element of index [0] to the element of index [length a - 1].\n\n It is a programming error to change the length of an array\n (by adding or removing elements) during an iteration on the\n array. Any iteration function will fail with [Invalid_argument]\n if it detects such a length change.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 237, "pos_bol": 8425, "pos_cnum": 8425 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 247, "pos_bol": 8896, "pos_cnum": 8898 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 237, "pos_bol": 8425, "pos_cnum": 8425 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 247, "pos_bol": 8896, "pos_cnum": 8898 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 237, "pos_bol": 8425, "pos_cnum": 8425 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 247, "pos_bol": 8896, "pos_cnum": 8898 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 237, "pos_bol": 8425, "pos_cnum": 8425 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 247, "pos_bol": 8896, "pos_cnum": 8898 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 237, "pos_bol": 8425, "pos_cnum": 8425 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 247, "pos_bol": 8896, "pos_cnum": 8898 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8904 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8908 }, "loc_ghost": false }, "txt2": "iter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8912 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8914 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8918 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8922 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8912 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8922 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8927 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8929 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8927 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8931 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8935 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8939 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8927 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8939 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8911 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8939 }, "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", " [iter f a] calls [f] on each element of [a]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8940 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8991 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8940 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8991 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8940 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8991 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8940 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 250, "pos_bol": 8940, "pos_cnum": 8991 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8900 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8939 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8900 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 249, "pos_bol": 8900, "pos_cnum": 8939 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 8997 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9002 }, "loc_ghost": false }, "txt2": "iteri" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9006 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9009 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9013 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9015 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9019 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9023 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9013 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9023 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9006 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9023 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9028 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9030 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9028 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9032 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9036 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9040 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9028 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9040 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9005 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9040 }, "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", " [iteri f a] calls [f i x] for each [x] at index [i] in [a]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9041 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9107 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9041 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9107 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9041 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9107 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9041 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 253, "pos_bol": 9041, "pos_cnum": 9107 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 8993 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9040 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 8993 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 252, "pos_bol": 8993, "pos_cnum": 9040 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9113 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9116 }, "loc_ghost": false }, "txt2": "map" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9120 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9122 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9126 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9128 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9120 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9128 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9133 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9133 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9137 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9141 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9143 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9141 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9133 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9119 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9145 }, "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", " [map f a] is a new array of elements of the form [f x]\n for each element [x] of [a].\n\n For example, if the elements of [a] are [x0], [x1], [x2],\n then the elements of [b] are [f x0], [f x1], [f x2].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 256, "pos_bol": 9146, "pos_cnum": 9146 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 261, "pos_bol": 9358, "pos_cnum": 9360 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 256, "pos_bol": 9146, "pos_cnum": 9146 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 261, "pos_bol": 9358, "pos_cnum": 9360 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 256, "pos_bol": 9146, "pos_cnum": 9146 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 261, "pos_bol": 9358, "pos_cnum": 9360 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 256, "pos_bol": 9146, "pos_cnum": 9146 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 261, "pos_bol": 9358, "pos_cnum": 9360 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9109 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9145 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9109 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 255, "pos_bol": 9109, "pos_cnum": 9145 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9366 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9370 }, "loc_ghost": false }, "txt2": "mapi" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9374 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9381 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9383 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9387 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9389 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9381 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9389 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9374 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9389 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9394 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9396 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9394 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9398 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9402 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9404 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9402 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9406 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9394 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9406 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9373 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9406 }, "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", " [mapi f a] is a new array of elements of the form [f i x]\n for each element [x] of [a] at index [i].\n\n For example, if the elements of [a] are [x0], [x1], [x2],\n then the elements of [b] are [f 0 x0], [f 1 x1], [f 2 x2].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 264, "pos_bol": 9407, "pos_cnum": 9407 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 269, "pos_bol": 9641, "pos_cnum": 9643 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 264, "pos_bol": 9407, "pos_cnum": 9407 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 269, "pos_bol": 9641, "pos_cnum": 9643 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 264, "pos_bol": 9407, "pos_cnum": 9407 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 269, "pos_bol": 9641, "pos_cnum": 9643 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 264, "pos_bol": 9407, "pos_cnum": 9407 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 269, "pos_bol": 9641, "pos_cnum": 9643 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9362 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9406 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9362 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 263, "pos_bol": 9362, "pos_cnum": 9406 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9649 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9658 }, "loc_ghost": false }, "txt2": "fold_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9662 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9666 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9670 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9672 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9676 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9680 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9670 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9680 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9662 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9680 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9685 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9689 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9693 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9693 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9697 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9701 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9705 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9693 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9705 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9685 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9705 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9661 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9705 }, "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", " [fold_left f acc a] folds [f] over [a] in order,\n starting with accumulator [acc].\n\n For example, if the elements of [a] are [x0], [x1],\n then [fold f acc a] is\n {[\n let acc = f acc x0 in\n let acc = f acc x1 in\n acc\n ]}\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 272, "pos_bol": 9706, "pos_cnum": 9706 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 282, "pos_bol": 9960, "pos_cnum": 9962 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 272, "pos_bol": 9706, "pos_cnum": 9706 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 282, "pos_bol": 9960, "pos_cnum": 9962 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 272, "pos_bol": 9706, "pos_cnum": 9706 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 282, "pos_bol": 9960, "pos_cnum": 9962 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 272, "pos_bol": 9706, "pos_cnum": 9706 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 282, "pos_bol": 9960, "pos_cnum": 9962 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9645 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9705 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9645 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 271, "pos_bol": 9645, "pos_cnum": 9705 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9968 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9978 }, "loc_ghost": false }, "txt2": "fold_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9982 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9984 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9988 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9992 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9996 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9988 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9982 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10005 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10007 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10005 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10009 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10013 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10017 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10021 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10025 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10013 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10025 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10005 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10025 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9981 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10025 }, "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", " [fold_right f a acc] computes\n [f x0 (f x1 (... (f xn acc) ...))]\n where [x0], [x1], ..., [xn] are the elements of [a].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 285, "pos_bol": 10026, "pos_cnum": 10026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 288, "pos_bol": 10156, "pos_cnum": 10158 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 285, "pos_bol": 10026, "pos_cnum": 10026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 288, "pos_bol": 10156, "pos_cnum": 10158 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 285, "pos_bol": 10026, "pos_cnum": 10026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 288, "pos_bol": 10156, "pos_cnum": 10158 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 285, "pos_bol": 10026, "pos_cnum": 10026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 288, "pos_bol": 10156, "pos_cnum": 10158 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9964 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10025 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 9964 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 284, "pos_bol": 9964, "pos_cnum": 10025 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10164 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10170 }, "loc_ghost": false }, "txt2": "filter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10174 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10180 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10184 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10174 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10184 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10189 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10191 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10189 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10193 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10197 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10199 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10197 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10201 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10189 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10201 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10173 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10201 }, "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", " [filter f a] is a new array of all the elements of [a] that satisfy [f].\n In other words, it is an array [b] such that, for each element [x]\n in [a] in order, [x] is added to [b] if [f x] is [true].\n\n For example, [filter (fun x -> x >= 0) a] is a new array\n of all non-negative elements of [a], in order.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 291, "pos_bol": 10202, "pos_cnum": 10202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 297, "pos_bol": 10524, "pos_cnum": 10526 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 291, "pos_bol": 10202, "pos_cnum": 10202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 297, "pos_bol": 10524, "pos_cnum": 10526 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 291, "pos_bol": 10202, "pos_cnum": 10202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 297, "pos_bol": 10524, "pos_cnum": 10526 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 291, "pos_bol": 10202, "pos_cnum": 10202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 297, "pos_bol": 10524, "pos_cnum": 10526 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10160 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10201 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10160 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 290, "pos_bol": 10160, "pos_cnum": 10201 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10532 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10542 }, "loc_ghost": false }, "txt2": "filter_map" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10546 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10548 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10552 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10552 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10561 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10546 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10561 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10566 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10568 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10566 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10570 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10574 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10576 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10574 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10578 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10566 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10578 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10545 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10578 }, "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", " [filter_map f a] is a new array of elements [y]\n such that [f x] is [Some y] for an element [x] of [a].\n In others words, it is an array [b] such that, for each element\n [x] of [a] in order:\n {ul\n {- if [f x = Some y], then [y] is added to [b],}\n {- if [f x = None], then no element is added to [b].}}\n\n For example, [filter_map int_of_string_opt inputs] returns\n a new array of integers read from the strings in [inputs],\n ignoring strings that cannot be converted to integers.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 300, "pos_bol": 10579, "pos_cnum": 10579 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 311, "pos_bol": 11089, "pos_cnum": 11091 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 300, "pos_bol": 10579, "pos_cnum": 10579 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 311, "pos_bol": 11089, "pos_cnum": 11091 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 300, "pos_bol": 10579, "pos_cnum": 10579 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 311, "pos_bol": 11089, "pos_cnum": 11091 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 300, "pos_bol": 10579, "pos_cnum": 10579 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 311, "pos_bol": 11089, "pos_cnum": 11091 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10528 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10578 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10528 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 299, "pos_bol": 10528, "pos_cnum": 10578 }, "loc_ghost": false } }, { "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", " {1:dynarray_scanning Dynarray scanning } ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11140 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11140 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11140 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11140 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 313, "pos_bol": 11093, "pos_cnum": 11140 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11146 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11152 }, "loc_ghost": false }, "txt2": "exists" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11156 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11162 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11156 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11171 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11173 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11171 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11175 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11179 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11183 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11171 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11183 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11155 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11183 }, "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", " [exists f a] is [true] if some element of [a] satisfies [f].\n\n For example, if the elements of [a] are [x0], [x1], [x2], then\n [exists f a] is [f x0 || f x1 || f x2].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 316, "pos_bol": 11184, "pos_cnum": 11184 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 320, "pos_bol": 11361, "pos_cnum": 11363 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 316, "pos_bol": 11184, "pos_cnum": 11184 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 320, "pos_bol": 11361, "pos_cnum": 11363 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 316, "pos_bol": 11184, "pos_cnum": 11184 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 320, "pos_bol": 11361, "pos_cnum": 11363 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 316, "pos_bol": 11184, "pos_cnum": 11184 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 320, "pos_bol": 11361, "pos_cnum": 11363 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11142 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11183 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11142 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 315, "pos_bol": 11142, "pos_cnum": 11183 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11369 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11376 }, "loc_ghost": false }, "txt2": "for_all" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11380 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11382 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11386 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11390 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11380 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11390 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11395 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11397 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11395 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11399 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11403 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11407 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11395 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11407 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11379 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11407 }, "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", " [for_all f a] is [true] if all elements of [a] satisfy [f].\n This includes the case where [a] is empty.\n\n For example, if the elements of [a] are [x0], [x1], then\n [exists f a] is [f x0 && f x1 && f x2].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 323, "pos_bol": 11408, "pos_cnum": 11408 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 328, "pos_bol": 11625, "pos_cnum": 11627 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 323, "pos_bol": 11408, "pos_cnum": 11408 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 328, "pos_bol": 11625, "pos_cnum": 11627 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 323, "pos_bol": 11408, "pos_cnum": 11408 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 328, "pos_bol": 11625, "pos_cnum": 11627 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 323, "pos_bol": 11408, "pos_cnum": 11408 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 328, "pos_bol": 11625, "pos_cnum": 11627 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11365 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11407 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11365 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 322, "pos_bol": 11365, "pos_cnum": 11407 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11633 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11636 }, "loc_ghost": false }, "txt2": "mem" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11639 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11641 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11645 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11647 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11645 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11649 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11653 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11657 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11645 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11657 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11639 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11657 }, "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", " [mem a set] is true if and only if [a] is structurally equal\n to an element of [set] (i.e. there is an [x] in [set] such that\n [compare a x = 0]).\n\n @since 5.3\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 331, "pos_bol": 11658, "pos_cnum": 11658 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 336, "pos_bol": 11831, "pos_cnum": 11833 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 331, "pos_bol": 11658, "pos_cnum": 11658 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 336, "pos_bol": 11831, "pos_cnum": 11833 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 331, "pos_bol": 11658, "pos_cnum": 11658 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 336, "pos_bol": 11831, "pos_cnum": 11833 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 331, "pos_bol": 11658, "pos_cnum": 11658 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 336, "pos_bol": 11831, "pos_cnum": 11833 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11629 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11657 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11629 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 330, "pos_bol": 11629, "pos_cnum": 11657 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11839 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11843 }, "loc_ghost": false }, "txt2": "memq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11846 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11848 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11852 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11854 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11852 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11856 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11860 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11852 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11846 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11864 }, "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 {!mem}, but uses physical equality\n instead of structural equality to compare array elements.\n\n @since 5.3\n ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 339, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 343, "pos_bol": 11990, "pos_cnum": 11993 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 339, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 343, "pos_bol": 11990, "pos_cnum": 11993 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 339, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 343, "pos_bol": 11990, "pos_cnum": 11993 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 339, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 343, "pos_bol": 11990, "pos_cnum": 11993 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11835 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11864 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11835 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 338, "pos_bol": 11835, "pos_cnum": 11864 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 11999 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12007 }, "loc_ghost": false }, "txt2": "find_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12011 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12017 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12021 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12011 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12021 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12028 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12030 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12034 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12036 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12034 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12043 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12026 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12043 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12010 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12043 }, "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", " [find_opt f a] returns the first element of the array [a] that satisfies\n the predicate [f], or [None] if there is no value that satisfies [f] in the\n array [a].\n\n @since 5.3\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 346, "pos_bol": 12044, "pos_cnum": 12044 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 351, "pos_bol": 12232, "pos_cnum": 12234 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 346, "pos_bol": 12044, "pos_cnum": 12044 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 351, "pos_bol": 12232, "pos_cnum": 12234 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 346, "pos_bol": 12044, "pos_cnum": 12044 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 351, "pos_bol": 12232, "pos_cnum": 12234 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 346, "pos_bol": 12044, "pos_cnum": 12044 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 351, "pos_bol": 12232, "pos_cnum": 12234 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 11995 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12043 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 11995 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 345, "pos_bol": 11995, "pos_cnum": 12043 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12240 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12250 }, "loc_ghost": false }, "txt2": "find_index" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12254 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12256 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12260 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12264 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12254 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12264 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12269 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12271 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12269 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12273 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12277 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12280 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12277 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12287 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12269 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12287 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12253 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12287 }, "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", " [find_index f a] returns [Some i], where [i] is the index of the first\n element of the array [a] that satisfies [f x], if there is such an\n element.\n\n It returns [None] if there is no such element.\n\n @since 5.3\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 354, "pos_bol": 12288, "pos_cnum": 12288 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 361, "pos_bol": 12515, "pos_cnum": 12517 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 354, "pos_bol": 12288, "pos_cnum": 12288 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 361, "pos_bol": 12515, "pos_cnum": 12517 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 354, "pos_bol": 12288, "pos_cnum": 12288 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 361, "pos_bol": 12515, "pos_cnum": 12517 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 354, "pos_bol": 12288, "pos_cnum": 12288 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 361, "pos_bol": 12515, "pos_cnum": 12517 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12236 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12287 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12236 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 353, "pos_bol": 12236, "pos_cnum": 12287 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12523 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12531 }, "loc_ghost": false }, "txt2": "find_map" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12535 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12537 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12541 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12543 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12541 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12550 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12535 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12550 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12555 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12557 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12555 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12559 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12563 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12565 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12563 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12555 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12534 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12572 }, "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", " [find_map f a] applies [f] to the elements of [a] in order, and returns the\n first result of the form [Some v], or [None] if none exist.\n\n @since 5.3\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 364, "pos_bol": 12573, "pos_cnum": 12573 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 368, "pos_bol": 12733, "pos_cnum": 12735 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 364, "pos_bol": 12573, "pos_cnum": 12573 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 368, "pos_bol": 12733, "pos_cnum": 12735 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 364, "pos_bol": 12573, "pos_cnum": 12573 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 368, "pos_bol": 12733, "pos_cnum": 12735 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 364, "pos_bol": 12573, "pos_cnum": 12573 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 368, "pos_bol": 12733, "pos_cnum": 12735 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12519 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12572 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12519 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 363, "pos_bol": 12519, "pos_cnum": 12572 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12741 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12750 }, "loc_ghost": false }, "txt2": "find_mapi" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12754 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12757 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12761 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12763 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12767 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12769 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12767 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12776 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12761 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12776 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12754 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12776 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12781 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12783 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12781 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12785 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12789 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12791 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12789 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12798 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12781 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12798 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12753 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12798 }, "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 [find_map], but the predicate is applied to the index of\n the element as first argument (counting from 0), and the element\n itself as second argument.\n\n @since 5.3\n ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 371, "pos_bol": 12799, "pos_cnum": 12799 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 376, "pos_bol": 12981, "pos_cnum": 12984 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 371, "pos_bol": 12799, "pos_cnum": 12799 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 376, "pos_bol": 12981, "pos_cnum": 12984 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 371, "pos_bol": 12799, "pos_cnum": 12799 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 376, "pos_bol": 12981, "pos_cnum": 12984 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 371, "pos_bol": 12799, "pos_cnum": 12799 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 376, "pos_bol": 12981, "pos_cnum": 12984 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12737 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12798 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12737 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 370, "pos_bol": 12737, "pos_cnum": 12798 }, "loc_ghost": false } }, { "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", " {1:comparison Comparison functions}\n\n Comparison functions iterate over their arguments; it is\n a programming error to change their length during the iteration,\n see the {{!section:iteration} Iteration} section above.\n ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 378, "pos_bol": 12986, "pos_cnum": 12986 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 383, "pos_bol": 13217, "pos_cnum": 13220 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 378, "pos_bol": 12986, "pos_cnum": 12986 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 383, "pos_bol": 13217, "pos_cnum": 13220 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 378, "pos_bol": 12986, "pos_cnum": 12986 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 383, "pos_bol": 13217, "pos_cnum": 13220 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 378, "pos_bol": 12986, "pos_cnum": 12986 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 383, "pos_bol": 13217, "pos_cnum": 13220 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 378, "pos_bol": 12986, "pos_cnum": 12986 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 383, "pos_bol": 13217, "pos_cnum": 13220 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13226 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13231 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13235 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13241 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13243 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13247 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13251 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13241 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13251 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13235 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13251 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13256 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13256 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13260 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13264 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13266 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13264 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13268 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13272 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13264 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13256 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13234 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13276 }, "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", " [equal eq a b] holds when [a] and [b] have the same length,\n and for all indices [i] we have [eq (get a i) (get b i)].\n\n @since 5.3\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 386, "pos_bol": 13277, "pos_cnum": 13277 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 390, "pos_bol": 13419, "pos_cnum": 13421 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 386, "pos_bol": 13277, "pos_cnum": 13277 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 390, "pos_bol": 13419, "pos_cnum": 13421 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 386, "pos_bol": 13277, "pos_cnum": 13277 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 390, "pos_bol": 13419, "pos_cnum": 13421 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 386, "pos_bol": 13277, "pos_cnum": 13277 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 390, "pos_bol": 13419, "pos_cnum": 13421 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13222 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13276 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13222 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 385, "pos_bol": 13222, "pos_cnum": 13276 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13427 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13434 }, "loc_ghost": false }, "txt2": "compare" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13438 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13440 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13444 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13450 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13444 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13438 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13458 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13460 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13458 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13462 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13466 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13468 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13466 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13474 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13477 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13466 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13477 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13458 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13477 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13437 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13477 }, "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", " Provided the function [cmp] defines a preorder on elements,\n [compare cmp a b] compares first [a] and [b] by their length,\n and then, if equal, by their elements according to\n the lexicographic preorder.\n\n For more details on comparison functions, see {!Array.sort}.\n\n @since 5.3\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 393, "pos_bol": 13478, "pos_cnum": 13478 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 401, "pos_bol": 13777, "pos_cnum": 13779 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 393, "pos_bol": 13478, "pos_cnum": 13478 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 401, "pos_bol": 13777, "pos_cnum": 13779 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 393, "pos_bol": 13478, "pos_cnum": 13478 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 401, "pos_bol": 13777, "pos_cnum": 13779 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 393, "pos_bol": 13478, "pos_cnum": 13478 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 401, "pos_bol": 13777, "pos_cnum": 13779 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13423 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13477 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13423 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 392, "pos_bol": 13423, "pos_cnum": 13477 }, "loc_ghost": false } }, { "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", " {1:conversions Conversions to other data structures}\n\n Note: the [of_*] functions raise [Invalid_argument] if the\n length needs to grow beyond {!Sys.max_array_length}.\n\n The [to_*] functions, except those specifically marked\n \"reentrant\", iterate on their dynarray argument. In particular it\n is a programming error if the length of the dynarray changes\n during their execution, and the conversion functions raise\n [Invalid_argument] if they observe such a change.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 404, "pos_bol": 13782, "pos_cnum": 13782 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 414, "pos_bol": 14272, "pos_cnum": 14274 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 404, "pos_bol": 13782, "pos_cnum": 13782 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 414, "pos_bol": 14272, "pos_cnum": 14274 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 404, "pos_bol": 13782, "pos_cnum": 13782 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 414, "pos_bol": 14272, "pos_cnum": 14274 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 404, "pos_bol": 13782, "pos_cnum": 13782 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 414, "pos_bol": 14272, "pos_cnum": 14274 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 404, "pos_bol": 13782, "pos_cnum": 13782 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 414, "pos_bol": 14272, "pos_cnum": 14274 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14280 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14288 }, "loc_ghost": false }, "txt2": "of_array" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14291 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14293 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14291 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14299 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14303 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14305 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14303 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14307 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14291 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14307 }, "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", " [of_array arr] returns a dynamic array corresponding to the\n fixed-sized array [a]. Operates in [O(n)] time by making a copy. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 417, "pos_bol": 14308, "pos_cnum": 14308 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 418, "pos_bol": 14372, "pos_cnum": 14443 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 417, "pos_bol": 14308, "pos_cnum": 14308 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 418, "pos_bol": 14372, "pos_cnum": 14443 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 417, "pos_bol": 14308, "pos_cnum": 14308 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 418, "pos_bol": 14372, "pos_cnum": 14443 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 417, "pos_bol": 14308, "pos_cnum": 14308 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 418, "pos_bol": 14372, "pos_cnum": 14443 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14276 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14307 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14276 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 416, "pos_bol": 14276, "pos_cnum": 14307 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14449 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14457 }, "loc_ghost": false }, "txt2": "to_array" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14460 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14462 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14460 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14468 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14468 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14476 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14460 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14476 }, "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", " [to_array a] returns a fixed-sized array corresponding to the\n dynamic array [a]. This always allocate a new array and copies\n elements into it. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 421, "pos_bol": 14477, "pos_cnum": 14477 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 423, "pos_bol": 14610, "pos_cnum": 14634 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 421, "pos_bol": 14477, "pos_cnum": 14477 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 423, "pos_bol": 14610, "pos_cnum": 14634 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 421, "pos_bol": 14477, "pos_cnum": 14477 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 423, "pos_bol": 14610, "pos_cnum": 14634 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 421, "pos_bol": 14477, "pos_cnum": 14477 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 423, "pos_bol": 14610, "pos_cnum": 14634 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14445 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14476 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14445 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 420, "pos_bol": 14445, "pos_cnum": 14476 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14640 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14647 }, "loc_ghost": false }, "txt2": "of_list" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14652 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14657 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14661 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14663 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14661 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14665 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14665 }, "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", " [of_list l] is the array containing the elements of [l] in\n the same order. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 426, "pos_bol": 14666, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 427, "pos_bol": 14729, "pos_cnum": 14751 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 426, "pos_bol": 14666, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 427, "pos_bol": 14729, "pos_cnum": 14751 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 426, "pos_bol": 14666, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 427, "pos_bol": 14729, "pos_cnum": 14751 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 426, "pos_bol": 14666, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 427, "pos_bol": 14729, "pos_cnum": 14751 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14636 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14665 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14636 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 425, "pos_bol": 14636, "pos_cnum": 14665 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14757 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14764 }, "loc_ghost": false }, "txt2": "to_list" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14767 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14769 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14767 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14775 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14777 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14775 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14782 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14767 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14782 }, "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", " [to_list a] is a list with the elements contained in the array [a]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14783 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14857 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14783 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14857 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14783 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14857 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14783 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 430, "pos_bol": 14783, "pos_cnum": 14857 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14753 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14782 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14753 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 429, "pos_bol": 14753, "pos_cnum": 14782 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14863 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14869 }, "loc_ghost": false }, "txt2": "of_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14872 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14874 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14872 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14884 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14886 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14884 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14888 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14872 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14888 }, "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", " [of_seq seq] is an array containing the same elements as [seq].\n\n It traverses [seq] once and will terminate only if [seq] is finite. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 433, "pos_bol": 14889, "pos_cnum": 14889 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 435, "pos_bol": 14958, "pos_cnum": 15032 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 433, "pos_bol": 14889, "pos_cnum": 14889 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 435, "pos_bol": 14958, "pos_cnum": 15032 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 433, "pos_bol": 14889, "pos_cnum": 14889 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 435, "pos_bol": 14958, "pos_cnum": 15032 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 433, "pos_bol": 14889, "pos_cnum": 14889 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 435, "pos_bol": 14958, "pos_cnum": 15032 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14859 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14888 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14859 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 432, "pos_bol": 14859, "pos_cnum": 14888 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15038 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15044 }, "loc_ghost": false }, "txt2": "to_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15047 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15049 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15047 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15051 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15055 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15057 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15055 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15063 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15047 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15063 }, "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", " [to_seq a] is the sequence of elements\n [get a 0], [get a 1]... [get a (length a - 1)]. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 438, "pos_bol": 15064, "pos_cnum": 15064 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 439, "pos_bol": 15107, "pos_cnum": 15161 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 438, "pos_bol": 15064, "pos_cnum": 15064 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 439, "pos_bol": 15107, "pos_cnum": 15161 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 438, "pos_bol": 15064, "pos_cnum": 15064 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 439, "pos_bol": 15107, "pos_cnum": 15161 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 438, "pos_bol": 15064, "pos_cnum": 15064 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 439, "pos_bol": 15107, "pos_cnum": 15161 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15034 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15063 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15034 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 437, "pos_bol": 15034, "pos_cnum": 15063 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15167 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15183 }, "loc_ghost": false }, "txt2": "to_seq_reentrant" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15186 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15188 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15186 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15190 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15194 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15196 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15194 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15202 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15186 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15202 }, "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", " [to_seq_reentrant a] is a reentrant variant of {!to_seq}, in the\n sense that one may still access its elements after the length of\n [a] has changed.\n\n Demanding the [i]-th element of the resulting sequence (which can\n happen zero, one or several times) will access the [i]-th element\n of [a] at the time of the demand. The sequence stops if [a] has\n less than [i] elements at this point.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 442, "pos_bol": 15203, "pos_cnum": 15203 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 450, "pos_bol": 15613, "pos_cnum": 15615 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 442, "pos_bol": 15203, "pos_cnum": 15203 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 450, "pos_bol": 15613, "pos_cnum": 15615 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 442, "pos_bol": 15203, "pos_cnum": 15203 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 450, "pos_bol": 15613, "pos_cnum": 15615 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 442, "pos_bol": 15203, "pos_cnum": 15203 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 450, "pos_bol": 15613, "pos_cnum": 15615 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15163 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15202 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15163 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 441, "pos_bol": 15163, "pos_cnum": 15202 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15621 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15631 }, "loc_ghost": false }, "txt2": "to_seq_rev" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15634 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15636 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15634 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15638 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15642 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15644 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15642 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15650 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15634 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15650 }, "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", " [to_seq_rev a] is the sequence of elements\n [get a (l - 1)], [get a (l - 2)]... [get a 0],\n where [l] is [length a] at the time [to_seq_rev] is invoked. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 453, "pos_bol": 15651, "pos_cnum": 15651 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 455, "pos_bol": 15749, "pos_cnum": 15816 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 453, "pos_bol": 15651, "pos_cnum": 15651 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 455, "pos_bol": 15749, "pos_cnum": 15816 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 453, "pos_bol": 15651, "pos_cnum": 15651 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 455, "pos_bol": 15749, "pos_cnum": 15816 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 453, "pos_bol": 15651, "pos_cnum": 15651 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 455, "pos_bol": 15749, "pos_cnum": 15816 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15617 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15650 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15617 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 452, "pos_bol": 15617, "pos_cnum": 15650 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15822 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15842 }, "loc_ghost": false }, "txt2": "to_seq_rev_reentrant" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15845 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15845 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15849 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15853 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15855 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15853 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15861 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15845 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15861 }, "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", " [to_seq_rev_reentrant a] is a reentrant variant of {!to_seq_rev},\n in the sense that one may still access its elements after the\n length of [a] has changed.\n\n Elements that have been removed from the array by the time they\n are demanded in the sequence are skipped.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 458, "pos_bol": 15862, "pos_cnum": 15862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 464, "pos_bol": 16144, "pos_cnum": 16146 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 458, "pos_bol": 15862, "pos_cnum": 15862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 464, "pos_bol": 16144, "pos_cnum": 16146 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 458, "pos_bol": 15862, "pos_cnum": 15862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 464, "pos_bol": 16144, "pos_cnum": 16146 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 458, "pos_bol": 15862, "pos_cnum": 15862 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 464, "pos_bol": 16144, "pos_cnum": 16146 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15818 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15861 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15818 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 457, "pos_bol": 15818, "pos_cnum": 15861 }, "loc_ghost": false } }, { "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", " {1:advanced Advanced topics for performance} ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16149 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16200 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16149 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16200 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16149 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16200 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16149 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16200 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16149 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 467, "pos_bol": 16149, "pos_cnum": 16200 }, "loc_ghost": false } }, { "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", " {2:capacity Backing array, capacity}\n\n Internally, a dynamic array uses a {b backing array} (a fixed-size\n array as provided by the {!Array} module) whose length is greater\n or equal to the length of the dynamic array. We define the {b\n capacity} of a dynamic array as the length of its backing array.\n\n The capacity of a dynamic array is relevant in advanced scenarios,\n when reasoning about the performance of dynamic array programs:\n {ul\n {- The memory usage of a dynamic array is proportional to its capacity,\n rather than its length.}\n {- When there is no empty space left at the end of the backing array,\n adding elements requires allocating a new, larger backing array.}}\n\n The implementation uses a standard exponential reallocation\n strategy which guarantees amortized constant-time operation; in\n particular, the total capacity of all backing arrays allocated\n over the lifetime of a dynamic array is at worst proportional to\n the total number of elements added.\n\n In other words, users need not care about capacity and reallocations,\n and they will get reasonable behavior by default. However, in some\n performance-sensitive scenarios the functions below can help control\n memory usage or guarantee an optimal number of reallocations.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 469, "pos_bol": 16202, "pos_cnum": 16202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 494, "pos_bol": 17518, "pos_cnum": 17520 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 469, "pos_bol": 16202, "pos_cnum": 16202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 494, "pos_bol": 17518, "pos_cnum": 17520 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 469, "pos_bol": 16202, "pos_cnum": 16202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 494, "pos_bol": 17518, "pos_cnum": 17520 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 469, "pos_bol": 16202, "pos_cnum": 16202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 494, "pos_bol": 17518, "pos_cnum": 17520 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 469, "pos_bol": 16202, "pos_cnum": 16202 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 494, "pos_bol": 17518, "pos_cnum": 17520 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17526 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17534 }, "loc_ghost": false }, "txt2": "capacity" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17537 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17539 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17537 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17545 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17548 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17537 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17548 }, "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", " [capacity a] is the length of [a]'s backing array. ", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17606 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17606 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17606 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17549 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 497, "pos_bol": 17549, "pos_cnum": 17606 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17522 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17548 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17522 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 496, "pos_bol": 17522, "pos_cnum": 17548 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17612 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17627 }, "loc_ghost": false }, "txt2": "ensure_capacity" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17632 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17638 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17641 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17645 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17649 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17638 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17649 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17630 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17649 }, "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", " [ensure_capacity a n] makes sure that the capacity of [a]\n is at least [n].\n\n @raise Invalid_argument if the requested capacity is\n outside the range [0 .. Sys.max_array_length].\n\n An example would be to reimplement {!of_array} without using {!init}:\n {[\n let of_array arr =\n let a = Dynarray.create () in\n Dynarray.ensure_capacity a (Array.length arr);\n Array.iter (fun v -> add_last a v) arr\n ]}\n\n Using [ensure_capacity] guarantees that at most one reallocation\n will take place, instead of possibly several.\n\n Without this [ensure_capacity] hint, the number of resizes would\n be logarithmic in the length of [arr], creating a constant-factor\n slowdown noticeable when [arr] is large.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 500, "pos_bol": 17650, "pos_cnum": 17650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 520, "pos_bol": 18395, "pos_cnum": 18397 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 500, "pos_bol": 17650, "pos_cnum": 17650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 520, "pos_bol": 18395, "pos_cnum": 18397 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 500, "pos_bol": 17650, "pos_cnum": 17650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 520, "pos_bol": 18395, "pos_cnum": 18397 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 500, "pos_bol": 17650, "pos_cnum": 17650 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 520, "pos_bol": 18395, "pos_cnum": 18397 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17608 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17649 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17608 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 499, "pos_bol": 17608, "pos_cnum": 17649 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18403 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18424 }, "loc_ghost": false }, "txt2": "ensure_extra_capacity" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18427 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18429 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18427 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18431 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18435 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18438 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18442 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18435 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18427 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18446 }, "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", " [ensure_extra_capacity a n] is [ensure_capacity a (length a + n)],\n it makes sure that [a] has room for [n] extra items.\n\n @raise Invalid_argument if the total requested capacity is\n outside the range [0 .. Sys.max_array_length].\n\n A use case would be to implement {!append_array}:\n {[\n let append_array a arr =\n ensure_extra_capacity a (Array.length arr);\n Array.iter (fun v -> add_last a v) arr\n ]}\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 523, "pos_bol": 18447, "pos_cnum": 18447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 535, "pos_bol": 18885, "pos_cnum": 18887 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 523, "pos_bol": 18447, "pos_cnum": 18447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 535, "pos_bol": 18885, "pos_cnum": 18887 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 523, "pos_bol": 18447, "pos_cnum": 18447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 535, "pos_bol": 18885, "pos_cnum": 18887 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 523, "pos_bol": 18447, "pos_cnum": 18447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 535, "pos_bol": 18885, "pos_cnum": 18887 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18399 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18446 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18399 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 522, "pos_bol": 18399, "pos_cnum": 18446 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18893 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18905 }, "loc_ghost": false }, "txt2": "fit_capacity" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18910 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18912 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18916 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18920 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18920 }, "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", " [fit_capacity a] reallocates a backing array if necessary, so that\n the resulting capacity is exactly [length a], with no additional\n empty space at the end. This can be useful to make sure there is\n no memory wasted on a long-lived array.\n\n Note that calling [fit_capacity] breaks the amortized complexity\n guarantees provided by the default reallocation strategy. Calling\n it repeatedly on an array may have quadratic complexity, both in\n time and in total number of words allocated.\n\n If you know that a dynamic array has reached its final length,\n which will remain fixed in the future, it is sufficient to call\n [to_array] and only keep the resulting fixed-size\n array. [fit_capacity] is useful when you need to keep a dynamic\n array for eventual future resizes.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 538, "pos_bol": 18921, "pos_cnum": 18921 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 553, "pos_bol": 19729, "pos_cnum": 19731 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 538, "pos_bol": 18921, "pos_cnum": 18921 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 553, "pos_bol": 19729, "pos_cnum": 19731 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 538, "pos_bol": 18921, "pos_cnum": 18921 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 553, "pos_bol": 19729, "pos_cnum": 19731 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 538, "pos_bol": 18921, "pos_cnum": 18921 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 553, "pos_bol": 19729, "pos_cnum": 19731 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18889 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18920 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18889 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 537, "pos_bol": 18889, "pos_cnum": 18920 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19737 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19749 }, "loc_ghost": false }, "txt2": "set_capacity" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19752 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19754 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19752 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19756 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19760 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19763 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19767 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19760 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19752 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19771 }, "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", " [set_capacity a n] reallocates a backing array if necessary,\n so that the resulting capacity is exactly [n]. In particular,\n all elements of index [n] or greater are removed.\n\n Like {!fit_capacity}, this function breaks the amortized\n complexity guarantees provided by the reallocation\n strategy. Calling it repeatedly on an array may have quadratic\n complexity, both in time and in total number of words allocated.\n\n This is an advanced function; in particular, {!ensure_capacity}\n should be preferred to increase the capacity, as it preserves\n those amortized guarantees.\n\n @raise Invalid_argument if [n < 0].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 556, "pos_bol": 19772, "pos_cnum": 19772 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 570, "pos_bol": 20418, "pos_cnum": 20420 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 556, "pos_bol": 19772, "pos_cnum": 19772 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 570, "pos_bol": 20418, "pos_cnum": 20420 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 556, "pos_bol": 19772, "pos_cnum": 19772 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 570, "pos_bol": 20418, "pos_cnum": 20420 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 556, "pos_bol": 19772, "pos_cnum": 19772 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 570, "pos_bol": 20418, "pos_cnum": 20420 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19733 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19771 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19733 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 555, "pos_bol": 19733, "pos_cnum": 19771 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20426 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20431 }, "loc_ghost": false }, "txt2": "reset" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20434 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20436 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20434 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20438 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20442 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20434 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20446 }, "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", " [reset a] clears [a] and replaces its backing array by an empty array.\n\n It is equivalent to [set_capacity a 0] or [clear a; fit_capacity a].\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 573, "pos_bol": 20447, "pos_cnum": 20447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 576, "pos_bol": 20596, "pos_cnum": 20598 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 573, "pos_bol": 20447, "pos_cnum": 20447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 576, "pos_bol": 20596, "pos_cnum": 20598 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 573, "pos_bol": 20447, "pos_cnum": 20447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 576, "pos_bol": 20596, "pos_cnum": 20598 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 573, "pos_bol": 20447, "pos_cnum": 20447 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 576, "pos_bol": 20596, "pos_cnum": 20598 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20422 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20446 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20422 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 572, "pos_bol": 20422, "pos_cnum": 20446 }, "loc_ghost": false } }, { "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", " {2:noleaks No leaks: preservation of memory liveness}\n\n The user-provided values reachable from a dynamic array [a] are\n exactly the elements in the indices [0] to [length a - 1]. In\n particular, no user-provided values are \"leaked\" by being present\n in the backing array at index [length a] or later.\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 578, "pos_bol": 20600, "pos_cnum": 20600 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 584, "pos_bol": 20918, "pos_cnum": 20920 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 578, "pos_bol": 20600, "pos_cnum": 20600 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 584, "pos_bol": 20918, "pos_cnum": 20920 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 578, "pos_bol": 20600, "pos_cnum": 20600 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 584, "pos_bol": 20918, "pos_cnum": 20920 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 578, "pos_bol": 20600, "pos_cnum": 20600 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 584, "pos_bol": 20918, "pos_cnum": 20920 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 578, "pos_bol": 20600, "pos_cnum": 20600 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 584, "pos_bol": 20918, "pos_cnum": 20920 }, "loc_ghost": false } }, { "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", " {1:examples Code examples}\n\n{2:example_min_heap Min-heaps for mutable priority queues}\n\nWe can use dynamic arrays to implement a mutable priority\nqueue. A priority queue provides a function to add elements, and\na function to extract the minimum element -- according to some\ncomparison function.\n\n{[\n(* We present our priority queues as a functor\n parametrized on the comparison function. *)\nmodule Heap (Elem : Map.OrderedType) : sig\n type t\n val create : unit -> t\n val add : t -> Elem.t -> unit\n val pop_min : t -> Elem.t option\nend = struct\n\n (* Our priority queues are implemented using the standard \"min heap\"\n data structure, a dynamic array representing a binary tree. *)\n type t = Elem.t Dynarray.t\n let create = Dynarray.create\n\n (* The node of index [i] has as children the nodes of index [2 * i + 1]\n and [2 * i + 2] -- if they are valid indices in the dynarray. *)\n let left_child i = 2 * i + 1\n let right_child i = 2 * i + 2\n let parent_node i = (i - 1) / 2\n\n (* We use indexing operators for convenient notations. *)\n let ( .!() ) = Dynarray.get\n let ( .!()<- ) = Dynarray.set\n\n (* Auxiliary functions to compare and swap two elements\n in the dynamic array. *)\n let order h i j =\n Elem.compare h.!(i) h.!(j)\n\n let swap h i j =\n let v = h.!(i) in\n h.!(i) <- h.!(j);\n h.!(j) <- v\n\n (* We say that a heap respects the \"heap ordering\" if the value of\n each node is smaller than the value of its children. The\n algorithm manipulates arrays that respect the heap algorithm,\n except for one node whose value may be too small or too large.\n\n The auxiliary functions [heap_up] and [heap_down] take\n such a misplaced value, and move it \"up\" (respectively: \"down\")\n the tree by permuting it with its parent value (respectively:\n a child value) until the heap ordering is restored. *)\n\n let rec heap_up h i =\n if i = 0 then () else\n let parent = parent_node i in\n if order h i parent < 0 then\n (swap h i parent; heap_up h parent)\n\n and heap_down h ~len i =\n let left, right = left_child i, right_child i in\n if left >= len then () (* no child, stop *) else\n let smallest =\n if right >= len then left (* no right child *) else\n if order h left right < 0 then left else right\n in\n if order h i smallest > 0 then\n (swap h i smallest; heap_down h ~len smallest)\n\n let add h s =\n let i = Dynarray.length h in\n Dynarray.add_last h s;\n heap_up h i\n\n let pop_min h =\n if Dynarray.is_empty h then None\n else begin\n (* Standard trick: swap the 'best' value at index 0\n with the last value of the array. *)\n let last = Dynarray.length h - 1 in\n swap h 0 last;\n (* At this point [pop_last] returns the 'best' value,\n and leaves a heap with one misplaced element at index [0]. *)\n let best = Dynarray.pop_last h in\n (* Restore the heap ordering -- does nothing if the heap is empty. *)\n heap_down h ~len:last 0;\n Some best\n end\nend\n]}\n\nThe production code from which this example was inspired includes\nlogic to free the backing array when the heap becomes empty, only in\nthe case where the capacity is above a certain threshold. This can be\ndone by calling the following function from [pop]:\n\n{[\nlet shrink h =\n if Dynarray.length h = 0 && Dynarray.capacity h > 1 lsl 18 then\n Dynarray.reset h\n]}\n\nThe [Heap] functor can be used to implement a sorting function, by\nadding all elements into a priority queue and then extracting them in\norder.\n\n{[\nlet heap_sort (type a) cmp li =\n let module Heap = Heap(struct type t = a let compare = cmp end) in\n let heap = Heap.create () in\n List.iter (Heap.add heap) li;\n List.map (fun _ -> Heap.pop_min heap |> Option.get) li\n]}\n\n", { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 587, "pos_bol": 20923, "pos_cnum": 20923 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 702, "pos_bol": 24683, "pos_cnum": 24685 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 587, "pos_bol": 20923, "pos_cnum": 20923 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 702, "pos_bol": 24683, "pos_cnum": 24685 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 587, "pos_bol": 20923, "pos_cnum": 20923 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 702, "pos_bol": 24683, "pos_cnum": 24685 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 587, "pos_bol": 20923, "pos_cnum": 20923 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 702, "pos_bol": 24683, "pos_cnum": 24685 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 587, "pos_bol": 20923, "pos_cnum": 20923 }, "loc_end": { "pos_fname": "./stdlib/dynarray.mli", "pos_lnum": 702, "pos_bol": 24683, "pos_cnum": 24685 }, "loc_ghost": false } } ]