[ { "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", " Association tables over ordered types.\n\n This module implements applicative association tables, also known as\n finite maps or dictionaries, given a total ordering function\n over the keys.\n All operations over maps are purely applicative (no side-effects).\n The implementation uses balanced binary trees, and therefore searching\n and insertion take time logarithmic in the size of the map.\n\n For instance:\n {[\n module IntPairs =\n struct\n type t = int * int\n let compare (x0,y0) (x1,y1) =\n match Stdlib.compare x0 x1 with\n 0 -> Stdlib.compare y0 y1\n | c -> c\n end\n\n module PairsMap = Map.Make(IntPairs)\n\n let m = PairsMap.(empty |> add (0,1) \"hello\" |> add (1,0) \"world\")\n ]}\n\n This creates a new module [PairsMap], with a new type ['a PairsMap.t]\n of maps from [int * int] to ['a]. In this example, [m] contains [string]\n values so its type is [string PairsMap.t].\n", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 19, "pos_bol": 1217, "pos_cnum": 1217 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 47, "pos_bol": 2185, "pos_cnum": 2187 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 19, "pos_bol": 1217, "pos_cnum": 1217 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 47, "pos_bol": 2185, "pos_cnum": 2187 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 19, "pos_bol": 1217, "pos_cnum": 1217 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 47, "pos_bol": 2185, "pos_cnum": 2187 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 19, "pos_bol": 1217, "pos_cnum": 1217 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 47, "pos_bol": 2185, "pos_cnum": 2187 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 19, "pos_bol": 1217, "pos_cnum": 1217 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 47, "pos_bol": 2185, "pos_cnum": 2187 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 49, "pos_bol": 2189, "pos_cnum": 2201 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 49, "pos_bol": 2189, "pos_cnum": 2212 }, "loc_ghost": false }, "txt2": "OrderedType" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 51, "pos_bol": 2221, "pos_cnum": 2230 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 51, "pos_bol": 2221, "pos_cnum": 2231 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [], "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", " The type of the map keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2238 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2270 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2238 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2270 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2238 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2270 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2238 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 52, "pos_bol": 2232, "pos_cnum": 2270 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 51, "pos_bol": 2221, "pos_cnum": 2225 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 51, "pos_bol": 2221, "pos_cnum": 2231 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 51, "pos_bol": 2221, "pos_cnum": 2225 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 51, "pos_bol": 2221, "pos_cnum": 2231 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2280 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2287 }, "loc_ghost": false }, "txt2": "compare" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2290 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2291 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2295 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2296 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2300 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2295 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2290 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2303 }, "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", " A total ordering function over the keys.\n This is a two-argument function [f] such that\n [f e1 e2] is zero if the keys [e1] and [e2] are equal,\n [f e1 e2] is strictly negative if [e1] is smaller than [e2],\n and [f e1 e2] is strictly positive if [e1] is greater than [e2].\n Example: a suitable ordering function is the generic structural\n comparison function {!Stdlib.compare}. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 55, "pos_bol": 2304, "pos_cnum": 2310 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 61, "pos_bol": 2696, "pos_cnum": 2747 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 55, "pos_bol": 2304, "pos_cnum": 2310 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 61, "pos_bol": 2696, "pos_cnum": 2747 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 55, "pos_bol": 2304, "pos_cnum": 2310 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 61, "pos_bol": 2696, "pos_cnum": 2747 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 55, "pos_bol": 2304, "pos_cnum": 2310 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 61, "pos_bol": 2696, "pos_cnum": 2747 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2276 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2303 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2276 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 54, "pos_bol": 2272, "pos_cnum": 2303 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 50, "pos_bol": 2215, "pos_cnum": 2217 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 62, "pos_bol": 2748, "pos_cnum": 2753 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmtd_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", " Input signature of the functor {!Make}. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2754 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2800 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2754 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2800 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2754 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2800 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2754 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 63, "pos_bol": 2754, "pos_cnum": 2800 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 49, "pos_bol": 2189, "pos_cnum": 2189 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 62, "pos_bol": 2748, "pos_cnum": 2753 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 49, "pos_bol": 2189, "pos_cnum": 2189 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 62, "pos_bol": 2748, "pos_cnum": 2753 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 65, "pos_bol": 2802, "pos_cnum": 2814 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 65, "pos_bol": 2802, "pos_cnum": 2815 }, "loc_ghost": false }, "txt2": "S" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "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:maps Maps} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2829 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2849 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2829 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2849 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2829 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2849 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2829 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2849 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2829 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 68, "pos_bol": 2825, "pos_cnum": 2849 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 70, "pos_bol": 2851, "pos_cnum": 2860 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 70, "pos_bol": 2851, "pos_cnum": 2863 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "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", " The type of the map keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2900 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2900 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2900 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 71, "pos_bol": 2864, "pos_cnum": 2900 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 70, "pos_bol": 2851, "pos_cnum": 2855 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 70, "pos_bol": 2851, "pos_cnum": 2863 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 70, "pos_bol": 2851, "pos_cnum": 2855 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 70, "pos_bol": 2851, "pos_cnum": 2863 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2916 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2917 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2913 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2915 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "Covariant" ], [ "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", " The type of maps from type [key] to type ['a]. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2975 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2975 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2975 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 74, "pos_bol": 2918, "pos_cnum": 2975 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2906 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2917 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2906 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 73, "pos_bol": 2902, "pos_cnum": 2917 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2985 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2990 }, "loc_ghost": false }, "txt2": "empty" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2992 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2994 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2992 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2996 }, "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", " The empty map. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3022 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3022 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3022 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 77, "pos_bol": 2997, "pos_cnum": 3022 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2981 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2996 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2981 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 76, "pos_bol": 2977, "pos_cnum": 2996 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3032 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3035 }, "loc_ghost": false }, "txt2": "add" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3041 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3044 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3053 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3055 }, "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/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3059 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3061 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3059 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "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/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3067 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3069 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3067 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3071 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3059 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3071 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3048 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3071 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3037 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "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", " [add ~key ~data m] returns a map containing the same bindings as\n [m], plus a binding of [key] to [data]. If [key] was already bound\n in [m] to a value that is physically equal to [data],\n [m] is returned unchanged (the result of the function is\n then physically equal to [m]). Otherwise, the previous binding\n of [key] in [m] disappears.\n @before 4.03 Physical equality was not ensured. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 80, "pos_bol": 3072, "pos_cnum": 3076 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 86, "pos_bol": 3454, "pos_cnum": 3512 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 80, "pos_bol": 3072, "pos_cnum": 3076 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 86, "pos_bol": 3454, "pos_cnum": 3512 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 80, "pos_bol": 3072, "pos_cnum": 3076 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 86, "pos_bol": 3454, "pos_cnum": 3512 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 80, "pos_bol": 3072, "pos_cnum": 3076 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 86, "pos_bol": 3454, "pos_cnum": 3512 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3028 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3071 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3028 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 79, "pos_bol": 3024, "pos_cnum": 3071 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3522 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3533 }, "loc_ghost": false }, "txt2": "add_to_list" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3539 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3551 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3553 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3557 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3559 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3557 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3564 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3557 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3566 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3570 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3570 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3577 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3570 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3557 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3546 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3535 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3579 }, "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_to_list ~key ~data m] is [m] with [key] mapped to [l] such\n that [l] is [data :: Map.find key m] if [key] was bound in\n [m] and [[v]] otherwise.\n @since 5.1 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 89, "pos_bol": 3580, "pos_cnum": 3584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 92, "pos_bol": 3752, "pos_cnum": 3773 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 89, "pos_bol": 3580, "pos_cnum": 3584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 92, "pos_bol": 3752, "pos_cnum": 3773 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 89, "pos_bol": 3580, "pos_cnum": 3584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 92, "pos_bol": 3752, "pos_cnum": 3773 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 89, "pos_bol": 3580, "pos_cnum": 3584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 92, "pos_bol": 3752, "pos_cnum": 3773 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3518 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3579 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3518 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 88, "pos_bol": 3514, "pos_cnum": 3579 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3783 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3789 }, "loc_ghost": false }, "txt2": "update" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3795 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3798 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3805 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3807 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3805 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3814 }, "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/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3818 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3820 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3818 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3827 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3805 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3827 }, "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/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3832 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3834 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3832 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3836 }, "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/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3840 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3842 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3840 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3832 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3802 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3791 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3844 }, "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", " [update ~key ~f m] returns a map containing the same bindings as\n [m], except for the binding of [key]. Depending on the value of\n [y] where [y] is [f (find_opt key m)], the binding of [key] is\n added, removed or updated. If [y] is [None], the binding is\n removed if it exists; otherwise, if [y] is [Some z] then [key]\n is associated to [z] in the resulting map. If [key] was already\n bound in [m] to a value that is physically equal to [z], [m]\n is returned unchanged (the result of the function is then\n physically equal to [m]).\n @since 4.06 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 95, "pos_bol": 3845, "pos_cnum": 3849 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 104, "pos_bol": 4442, "pos_cnum": 4464 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 95, "pos_bol": 3845, "pos_cnum": 3849 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 104, "pos_bol": 4442, "pos_cnum": 4464 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 95, "pos_bol": 3845, "pos_cnum": 3849 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 104, "pos_bol": 4442, "pos_cnum": 4464 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 95, "pos_bol": 3845, "pos_cnum": 3849 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 104, "pos_bol": 4442, "pos_cnum": 4464 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3779 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3844 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3779 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 94, "pos_bol": 3775, "pos_cnum": 3844 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4483 }, "loc_ghost": false }, "txt2": "singleton" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4488 }, "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/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4492 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4494 }, "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/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4498 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4500 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4498 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4502 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4492 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4502 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4502 }, "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", " [singleton x y] returns the one-element map that contains a binding\n [y] for [x].\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 107, "pos_bol": 4503, "pos_cnum": 4507 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 109, "pos_bol": 4600, "pos_cnum": 4622 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 107, "pos_bol": 4503, "pos_cnum": 4507 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 109, "pos_bol": 4600, "pos_cnum": 4622 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 107, "pos_bol": 4503, "pos_cnum": 4507 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 109, "pos_bol": 4600, "pos_cnum": 4622 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 107, "pos_bol": 4503, "pos_cnum": 4507 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 109, "pos_bol": 4600, "pos_cnum": 4622 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4470 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4502 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4470 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 106, "pos_bol": 4466, "pos_cnum": 4502 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4632 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4638 }, "loc_ghost": false }, "txt2": "remove" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4640 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4643 }, "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/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4647 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4649 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4647 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4651 }, "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/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4655 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4657 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4655 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4659 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4647 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4659 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4640 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4659 }, "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 x m] returns a map containing the same bindings as\n [m], except for [x] which is unbound in the returned map.\n If [x] was not in [m], [m] is returned unchanged\n (the result of the function is then physically equal to [m]).\n @before 4.03 Physical equality was not ensured. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 112, "pos_bol": 4660, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 116, "pos_bol": 4920, "pos_cnum": 4978 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 112, "pos_bol": 4660, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 116, "pos_bol": 4920, "pos_cnum": 4978 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 112, "pos_bol": 4660, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 116, "pos_bol": 4920, "pos_cnum": 4978 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 112, "pos_bol": 4660, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 116, "pos_bol": 4920, "pos_cnum": 4978 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4628 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4659 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4628 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 111, "pos_bol": 4624, "pos_cnum": 4659 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 118, "pos_bol": 4980, "pos_cnum": 4988 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 118, "pos_bol": 4980, "pos_cnum": 4993 }, "loc_ghost": false }, "txt2": "merge" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5004 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5007 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5011 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5011 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5020 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5024 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5026 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5024 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5037 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5039 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5037 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5024 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5011 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5004 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5046 }, "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/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5057 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5059 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5057 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5061 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5065 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5067 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5065 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5069 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5073 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5075 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5073 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5077 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5065 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5077 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5057 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5077 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 119, "pos_bol": 4995, "pos_cnum": 5001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5077 }, "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", " [merge ~f m1 m2] computes a map whose keys are a subset of the keys of\n [m1] and of [m2]. The presence of each such binding, and the\n corresponding value, is determined with the function [f].\n In terms of the [find_opt] operation, we have\n [find_opt x (merge f m1 m2) = f x (find_opt x m1) (find_opt x m2)]\n for any key [x], provided that [f x None None = None].\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 121, "pos_bol": 5078, "pos_cnum": 5082 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 127, "pos_bol": 5484, "pos_cnum": 5506 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 121, "pos_bol": 5078, "pos_cnum": 5082 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 127, "pos_bol": 5484, "pos_cnum": 5506 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 121, "pos_bol": 5078, "pos_cnum": 5082 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 127, "pos_bol": 5484, "pos_cnum": 5506 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 121, "pos_bol": 5078, "pos_cnum": 5082 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 127, "pos_bol": 5484, "pos_cnum": 5506 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 118, "pos_bol": 4980, "pos_cnum": 4984 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5077 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 118, "pos_bol": 4980, "pos_cnum": 4984 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 120, "pos_bol": 5051, "pos_cnum": 5077 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5516 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5521 }, "loc_ghost": false }, "txt2": "union" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5526 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5529 }, "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/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5533 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5535 }, "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/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5539 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5541 }, "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/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5545 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5547 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5545 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5539 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5533 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5526 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5554 }, "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/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5559 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5561 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5559 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5563 }, "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/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5567 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5569 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5567 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5571 }, "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/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5575 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5577 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5575 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5567 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5559 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5523 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5579 }, "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", " [union ~f m1 m2] computes a map whose keys are a subset of the keys\n of [m1] and of [m2]. When the same binding is defined in both\n arguments, the function [f] is used to combine them.\n This is a special case of [merge]: [union f m1 m2] is equivalent\n to [merge f' m1 m2], where\n - [f' _key None None = None]\n - [f' _key (Some v) None = Some v]\n - [f' _key None (Some v) = Some v]\n - [f' key (Some v1) (Some v2) = f key v1 v2]\n\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 130, "pos_bol": 5580, "pos_cnum": 5584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 140, "pos_bol": 6073, "pos_cnum": 6095 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 130, "pos_bol": 5580, "pos_cnum": 5584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 140, "pos_bol": 6073, "pos_cnum": 6095 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 130, "pos_bol": 5580, "pos_cnum": 5584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 140, "pos_bol": 6073, "pos_cnum": 6095 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 130, "pos_bol": 5580, "pos_cnum": 5584 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 140, "pos_bol": 6073, "pos_cnum": 6095 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5512 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5579 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5512 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 129, "pos_bol": 5508, "pos_cnum": 5579 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6105 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6113 }, "loc_ghost": false }, "txt2": "cardinal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6115 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6117 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6115 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6119 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6123 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6126 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6115 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6126 }, "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", " Return the number of bindings of a map.\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 143, "pos_bol": 6127, "pos_cnum": 6131 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 144, "pos_bol": 6175, "pos_cnum": 6197 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 143, "pos_bol": 6127, "pos_cnum": 6131 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 144, "pos_bol": 6175, "pos_cnum": 6197 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 143, "pos_bol": 6127, "pos_cnum": 6131 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 144, "pos_bol": 6175, "pos_cnum": 6197 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 143, "pos_bol": 6127, "pos_cnum": 6131 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 144, "pos_bol": 6175, "pos_cnum": 6197 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6101 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6126 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6101 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 142, "pos_bol": 6097, "pos_cnum": 6126 }, "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:bindings Bindings} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6203 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6231 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6203 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6231 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6203 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6231 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6203 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6231 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6203 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 146, "pos_bol": 6199, "pos_cnum": 6231 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6241 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6249 }, "loc_ghost": false }, "txt2": "bindings" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6251 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6253 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6251 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6255 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6260 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6263 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6266 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6268 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6260 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6268 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6259 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6274 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6251 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6274 }, "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", " Return the list of all bindings of the given map.\n The returned list is sorted in increasing order of keys with respect\n to the ordering [Ord.compare], where [Ord] is the argument\n given to {!Map.Make}.\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 149, "pos_bol": 6275, "pos_cnum": 6279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 153, "pos_bol": 6507, "pos_cnum": 6529 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 149, "pos_bol": 6275, "pos_cnum": 6279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 153, "pos_bol": 6507, "pos_cnum": 6529 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 149, "pos_bol": 6275, "pos_cnum": 6279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 153, "pos_bol": 6507, "pos_cnum": 6529 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 149, "pos_bol": 6275, "pos_cnum": 6279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 153, "pos_bol": 6507, "pos_cnum": 6529 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6237 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6274 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6237 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 148, "pos_bol": 6233, "pos_cnum": 6274 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6539 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6550 }, "loc_ghost": false }, "txt2": "min_binding" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6552 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6552 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6556 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6561 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6564 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6567 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6569 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6561 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6569 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6552 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6570 }, "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", " Return the binding with the smallest key in a given map\n (with respect to the [Ord.compare] ordering), or raise\n [Not_found] if the map is empty.\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 156, "pos_bol": 6571, "pos_cnum": 6575 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 159, "pos_bol": 6739, "pos_cnum": 6761 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 156, "pos_bol": 6571, "pos_cnum": 6575 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 159, "pos_bol": 6739, "pos_cnum": 6761 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 156, "pos_bol": 6571, "pos_cnum": 6575 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 159, "pos_bol": 6739, "pos_cnum": 6761 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 156, "pos_bol": 6571, "pos_cnum": 6575 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 159, "pos_bol": 6739, "pos_cnum": 6761 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6535 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6570 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6535 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 155, "pos_bol": 6531, "pos_cnum": 6570 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6771 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6786 }, "loc_ghost": false }, "txt2": "min_binding_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/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6788 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6790 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6788 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6792 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6797 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6800 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6803 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6797 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6796 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6813 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6788 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6813 }, "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", " Return the binding with the smallest key in the given map\n (with respect to the [Ord.compare] ordering), or [None]\n if the map is empty.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 162, "pos_bol": 6814, "pos_cnum": 6818 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 165, "pos_bol": 6973, "pos_cnum": 6995 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 162, "pos_bol": 6814, "pos_cnum": 6818 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 165, "pos_bol": 6973, "pos_cnum": 6995 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 162, "pos_bol": 6814, "pos_cnum": 6818 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 165, "pos_bol": 6973, "pos_cnum": 6995 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 162, "pos_bol": 6814, "pos_cnum": 6818 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 165, "pos_bol": 6973, "pos_cnum": 6995 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6767 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6813 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6767 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 161, "pos_bol": 6763, "pos_cnum": 6813 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7005 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7016 }, "loc_ghost": false }, "txt2": "max_binding" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7018 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7020 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7018 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7022 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7027 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7030 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7033 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7035 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7027 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7035 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7018 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7036 }, "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 {!min_binding}, but returns the binding with\n the largest key in the given map.\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 168, "pos_bol": 7037, "pos_cnum": 7041 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 170, "pos_bol": 7140, "pos_cnum": 7162 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 168, "pos_bol": 7037, "pos_cnum": 7041 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 170, "pos_bol": 7140, "pos_cnum": 7162 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 168, "pos_bol": 7037, "pos_cnum": 7041 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 170, "pos_bol": 7140, "pos_cnum": 7162 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 168, "pos_bol": 7037, "pos_cnum": 7041 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 170, "pos_bol": 7140, "pos_cnum": 7162 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7036 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 167, "pos_bol": 6997, "pos_cnum": 7036 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7172 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7187 }, "loc_ghost": false }, "txt2": "max_binding_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/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7189 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7191 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7189 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7193 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7198 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7201 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7204 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7198 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7197 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7214 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7189 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7214 }, "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 {!min_binding_opt}, but returns the binding with\n the largest key in the given map.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 173, "pos_bol": 7215, "pos_cnum": 7219 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 175, "pos_bol": 7322, "pos_cnum": 7344 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 173, "pos_bol": 7215, "pos_cnum": 7219 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 175, "pos_bol": 7322, "pos_cnum": 7344 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 173, "pos_bol": 7215, "pos_cnum": 7219 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 175, "pos_bol": 7322, "pos_cnum": 7344 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 173, "pos_bol": 7215, "pos_cnum": 7219 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 175, "pos_bol": 7322, "pos_cnum": 7344 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7168 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7214 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7168 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 172, "pos_bol": 7164, "pos_cnum": 7214 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7354 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7360 }, "loc_ghost": false }, "txt2": "choose" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7362 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7364 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7362 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7371 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7374 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7377 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7371 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7362 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7380 }, "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", " Return one binding of the given map, or raise [Not_found] if\n the map is empty. Which binding is chosen is unspecified,\n but equal bindings will be chosen for equal maps.\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 178, "pos_bol": 7381, "pos_cnum": 7385 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 181, "pos_bol": 7574, "pos_cnum": 7596 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 178, "pos_bol": 7381, "pos_cnum": 7385 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 181, "pos_bol": 7574, "pos_cnum": 7596 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 178, "pos_bol": 7381, "pos_cnum": 7385 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 181, "pos_bol": 7574, "pos_cnum": 7596 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 178, "pos_bol": 7381, "pos_cnum": 7385 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 181, "pos_bol": 7574, "pos_cnum": 7596 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7350 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7380 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7350 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 177, "pos_bol": 7346, "pos_cnum": 7380 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7606 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7616 }, "loc_ghost": false }, "txt2": "choose_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/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7618 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7620 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7618 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7622 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7627 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7630 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7633 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7635 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7627 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7635 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7626 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7643 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7618 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7643 }, "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", " Return one binding of the given map, or [None] if\n the map is empty. Which binding is chosen is unspecified,\n but equal bindings will be chosen for equal maps.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 184, "pos_bol": 7644, "pos_cnum": 7648 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 187, "pos_bol": 7826, "pos_cnum": 7848 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 184, "pos_bol": 7644, "pos_cnum": 7648 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 187, "pos_bol": 7826, "pos_cnum": 7848 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 184, "pos_bol": 7644, "pos_cnum": 7648 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 187, "pos_bol": 7826, "pos_cnum": 7848 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 184, "pos_bol": 7644, "pos_cnum": 7648 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 187, "pos_bol": 7826, "pos_cnum": 7848 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7602 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7643 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7602 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 183, "pos_bol": 7598, "pos_cnum": 7643 }, "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:searching Searching} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7854 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7884 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7854 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7884 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7854 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7884 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7854 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7884 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7854 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 189, "pos_bol": 7850, "pos_cnum": 7884 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7894 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7898 }, "loc_ghost": false }, "txt2": "find" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7900 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7903 }, "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/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7907 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7909 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7907 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7911 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7915 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7917 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7907 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7917 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7900 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7917 }, "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 x m] returns the current value of [x] in [m],\n or raises [Not_found] if no binding for [x] exists. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 192, "pos_bol": 7918, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 193, "pos_bol": 7978, "pos_cnum": 8040 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 192, "pos_bol": 7918, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 193, "pos_bol": 7978, "pos_cnum": 8040 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 192, "pos_bol": 7918, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 193, "pos_bol": 7978, "pos_cnum": 8040 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 192, "pos_bol": 7918, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 193, "pos_bol": 7978, "pos_cnum": 8040 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7890 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7917 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7890 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 191, "pos_bol": 7886, "pos_cnum": 7917 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8050 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8058 }, "loc_ghost": false }, "txt2": "find_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8060 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8063 }, "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/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8067 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8069 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8067 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8071 }, "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/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8075 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8077 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8075 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8067 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8060 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8084 }, "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 x m] returns [Some v] if the current value of [x]\n in [m] is [v], or [None] if no binding for [x] exists.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 196, "pos_bol": 8085, "pos_cnum": 8089 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 198, "pos_bol": 8216, "pos_cnum": 8238 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 196, "pos_bol": 8085, "pos_cnum": 8089 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 198, "pos_bol": 8216, "pos_cnum": 8238 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 196, "pos_bol": 8085, "pos_cnum": 8089 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 198, "pos_bol": 8216, "pos_cnum": 8238 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 196, "pos_bol": 8085, "pos_cnum": 8089 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 198, "pos_bol": 8216, "pos_cnum": 8238 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8046 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8084 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8046 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 195, "pos_bol": 8042, "pos_cnum": 8084 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8248 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8258 }, "loc_ghost": false }, "txt2": "find_first" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8263 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8266 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8270 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8274 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8263 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8274 }, "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/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8281 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8283 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8287 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8290 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8293 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8295 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8287 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8295 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8279 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8295 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8260 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8295 }, "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_first ~f m], where [f] is a monotonically increasing function,\n returns the binding of [m] with the lowest key [k] such that [f k],\n or raises [Not_found] if no such key exists.\n\n For example, [find_first (fun k -> Ord.compare k x >= 0) m] will\n return the first binding [k, v] of [m] where [Ord.compare k x >= 0]\n (intuitively: [k >= x]), or raise [Not_found] if [x] is greater than\n any element of [m].\n\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 201, "pos_bol": 8296, "pos_cnum": 8300 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 210, "pos_bol": 8758, "pos_cnum": 8780 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 201, "pos_bol": 8296, "pos_cnum": 8300 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 210, "pos_bol": 8758, "pos_cnum": 8780 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 201, "pos_bol": 8296, "pos_cnum": 8300 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 210, "pos_bol": 8758, "pos_cnum": 8780 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 201, "pos_bol": 8296, "pos_cnum": 8300 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 210, "pos_bol": 8758, "pos_cnum": 8780 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8244 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8295 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8244 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 200, "pos_bol": 8240, "pos_cnum": 8295 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8790 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8804 }, "loc_ghost": false }, "txt2": "find_first_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8809 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8812 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8816 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8820 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8809 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8820 }, "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/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8825 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8827 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8825 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8829 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8834 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8837 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8840 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8842 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8834 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8842 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8833 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8850 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8825 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8850 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8806 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8850 }, "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_first_opt ~f m], where [f] is a monotonically increasing\n function, returns an option containing the binding of [m] with the\n lowest key [k] such that [f k], or [None] if no such key exists.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 213, "pos_bol": 8851, "pos_cnum": 8855 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 216, "pos_bol": 9070, "pos_cnum": 9092 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 213, "pos_bol": 8851, "pos_cnum": 8855 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 216, "pos_bol": 9070, "pos_cnum": 9092 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 213, "pos_bol": 8851, "pos_cnum": 8855 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 216, "pos_bol": 9070, "pos_cnum": 9092 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 213, "pos_bol": 8851, "pos_cnum": 8855 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 216, "pos_bol": 9070, "pos_cnum": 9092 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8786 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8850 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8786 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 212, "pos_bol": 8782, "pos_cnum": 8850 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9102 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9111 }, "loc_ghost": false }, "txt2": "find_last" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9116 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9119 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9123 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9127 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9116 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9127 }, "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/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9132 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9134 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9132 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9136 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9140 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9143 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9146 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9140 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9132 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9113 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9148 }, "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 ~f m], where [f] is a monotonically decreasing function,\n returns the binding of [m] with the highest key [k] such that [f k],\n or raises [Not_found] if no such key exists.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 219, "pos_bol": 9149, "pos_cnum": 9153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 222, "pos_bol": 9355, "pos_cnum": 9377 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 219, "pos_bol": 9149, "pos_cnum": 9153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 222, "pos_bol": 9355, "pos_cnum": 9377 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 219, "pos_bol": 9149, "pos_cnum": 9153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 222, "pos_bol": 9355, "pos_cnum": 9377 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 219, "pos_bol": 9149, "pos_cnum": 9153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 222, "pos_bol": 9355, "pos_cnum": 9377 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9098 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9148 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9098 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 218, "pos_bol": 9094, "pos_cnum": 9148 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9387 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9400 }, "loc_ghost": false }, "txt2": "find_last_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9405 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9408 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9412 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9416 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9405 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9416 }, "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/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9421 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9421 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9425 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9430 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9433 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9436 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9438 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9430 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9438 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9429 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9421 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9402 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9446 }, "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_opt ~f m], where [f] is a monotonically decreasing\n function, returns an option containing the binding of [m] with\n the highest key [k] such that [f k], or [None] if no such key\n exists.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 225, "pos_bol": 9447, "pos_cnum": 9451 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 229, "pos_bol": 9674, "pos_cnum": 9696 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 225, "pos_bol": 9447, "pos_cnum": 9451 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 229, "pos_bol": 9674, "pos_cnum": 9696 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 225, "pos_bol": 9447, "pos_cnum": 9451 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 229, "pos_bol": 9674, "pos_cnum": 9696 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 225, "pos_bol": 9447, "pos_cnum": 9451 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 229, "pos_bol": 9674, "pos_cnum": 9696 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9383 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9446 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9383 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 224, "pos_bol": 9379, "pos_cnum": 9446 }, "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:traversing Traversing} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9702 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9734 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9702 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9734 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9702 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9734 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9702 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9734 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9702 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 231, "pos_bol": 9698, "pos_cnum": 9734 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9744 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9748 }, "loc_ghost": false }, "txt2": "iter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9757 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9760 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9769 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9775 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9779 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9764 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9779 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9753 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9779 }, "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/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9784 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9786 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9784 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9788 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9792 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9796 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9784 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9796 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9750 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9796 }, "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 m] applies [f] to all bindings in map [m].\n [f] receives the key as first argument, and the associated value\n as second argument. The bindings are passed to [f] in increasing\n order with respect to the ordering over the type of the keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 234, "pos_bol": 9797, "pos_cnum": 9801 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 237, "pos_bol": 10004, "pos_cnum": 10076 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 234, "pos_bol": 9797, "pos_cnum": 9801 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 237, "pos_bol": 10004, "pos_cnum": 10076 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 234, "pos_bol": 9797, "pos_cnum": 9801 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 237, "pos_bol": 10004, "pos_cnum": 10076 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 234, "pos_bol": 9797, "pos_cnum": 9801 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 237, "pos_bol": 10004, "pos_cnum": 10076 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9740 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9796 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9740 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 233, "pos_bol": 9736, "pos_cnum": 9796 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 239, "pos_bol": 10078, "pos_cnum": 10086 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 239, "pos_bol": 10078, "pos_cnum": 10090 }, "loc_ghost": false }, "txt2": "fold" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10105 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10108 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10117 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10119 }, "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/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10123 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10127 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10131 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10123 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10112 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10101 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10135 }, "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/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10140 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10142 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10140 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10144 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "init" ], { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10161 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10165 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10148 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10165 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10140 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10165 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10098 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10165 }, "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 ~f m ~init] computes [(f kN dN ... (f k1 d1 init)...)],\n where [k1 ... kN] are the keys of all bindings in [m]\n (in increasing order), and [d1 ... dN] are the associated data. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 241, "pos_bol": 10166, "pos_cnum": 10170 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 243, "pos_bol": 10298, "pos_cnum": 10372 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 241, "pos_bol": 10166, "pos_cnum": 10170 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 243, "pos_bol": 10298, "pos_cnum": 10372 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 241, "pos_bol": 10166, "pos_cnum": 10170 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 243, "pos_bol": 10298, "pos_cnum": 10372 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 241, "pos_bol": 10166, "pos_cnum": 10170 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 243, "pos_bol": 10298, "pos_cnum": 10372 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 239, "pos_bol": 10078, "pos_cnum": 10082 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10165 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 239, "pos_bol": 10078, "pos_cnum": 10082 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 240, "pos_bol": 10092, "pos_cnum": 10165 }, "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:transforming Transforming} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10378 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10414 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10378 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10414 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10378 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10414 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10378 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10414 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10378 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 245, "pos_bol": 10374, "pos_cnum": 10414 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10424 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10427 }, "loc_ghost": false }, "txt2": "map" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10432 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10434 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10438 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10440 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10432 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10440 }, "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/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10445 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10447 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10445 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10449 }, "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/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10453 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10455 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10453 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10445 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10429 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10457 }, "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 m] returns a map with same domain as [m], where the\n associated value [a] of all bindings of [m] has been\n replaced by the result of the application of [f] to [a].\n The bindings are passed to [f] in increasing order\n with respect to the ordering over the type of the keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 248, "pos_bol": 10458, "pos_cnum": 10462 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 252, "pos_bol": 10711, "pos_cnum": 10777 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 248, "pos_bol": 10458, "pos_cnum": 10462 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 252, "pos_bol": 10711, "pos_cnum": 10777 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 248, "pos_bol": 10458, "pos_cnum": 10462 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 252, "pos_bol": 10711, "pos_cnum": 10777 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 248, "pos_bol": 10458, "pos_cnum": 10462 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 252, "pos_bol": 10711, "pos_cnum": 10777 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10420 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10457 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10420 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 247, "pos_bol": 10416, "pos_cnum": 10457 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10787 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10791 }, "loc_ghost": false }, "txt2": "mapi" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10796 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10799 }, "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/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10803 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10809 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10811 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10803 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10811 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10796 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10811 }, "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/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10816 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10818 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10816 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10820 }, "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/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10824 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10826 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10824 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10828 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10816 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10828 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10793 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10828 }, "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 {!map}, but the function receives as arguments both the\n key and the associated value for each binding of the map. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 255, "pos_bol": 10829, "pos_cnum": 10833 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 256, "pos_bol": 10901, "pos_cnum": 10969 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 255, "pos_bol": 10829, "pos_cnum": 10833 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 256, "pos_bol": 10901, "pos_cnum": 10969 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 255, "pos_bol": 10829, "pos_cnum": 10833 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 256, "pos_bol": 10901, "pos_cnum": 10969 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 255, "pos_bol": 10829, "pos_cnum": 10833 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 256, "pos_bol": 10901, "pos_cnum": 10969 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10783 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10828 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10783 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 254, "pos_bol": 10779, "pos_cnum": 10828 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10979 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10985 }, "loc_ghost": false }, "txt2": "filter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10990 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10993 }, "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/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10997 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10999 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11003 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11007 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10997 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11007 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10990 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11007 }, "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/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11012 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11014 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11012 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11016 }, "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/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11022 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11024 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11012 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11024 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10987 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11024 }, "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 m] returns the map with all the bindings in [m]\n that satisfy predicate [p]. If every binding in [m] satisfies [f],\n [m] is returned unchanged (the result of the function is then\n physically equal to [m])\n @since 3.12\n @before 4.03 Physical equality was not ensured. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 259, "pos_bol": 11025, "pos_cnum": 11029 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 264, "pos_bol": 11290, "pos_cnum": 11348 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 259, "pos_bol": 11025, "pos_cnum": 11029 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 264, "pos_bol": 11290, "pos_cnum": 11348 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 259, "pos_bol": 11025, "pos_cnum": 11029 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 264, "pos_bol": 11290, "pos_cnum": 11348 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 259, "pos_bol": 11025, "pos_cnum": 11029 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 264, "pos_bol": 11290, "pos_cnum": 11348 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10975 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11024 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 10975 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 258, "pos_bol": 10971, "pos_cnum": 11024 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11358 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11368 }, "loc_ghost": false }, "txt2": "filter_map" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11373 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11376 }, "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/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11380 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11382 }, "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/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11386 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11388 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11386 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11395 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11380 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11395 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11373 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11395 }, "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/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11400 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11402 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11400 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11404 }, "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/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11408 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11410 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11408 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11412 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11400 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11412 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11370 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11412 }, "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 m] applies the function [f] to every binding of\n [m], and builds a map from the results. For each binding\n [(k, v)] in the input map:\n - if [f k v] is [None] then [k] is not in the result,\n - if [f k v] is [Some v'] then the binding [(k, v')]\n is in the output map.\n\n For example, the following function on maps whose values are lists\n {[\n filter_map\n (fun _k li -> match li with [] -> None | _::tl -> Some tl)\n m\n ]}\n drops all bindings of [m] whose value is an empty list, and pops\n the first element of each value that is non-empty.\n\n @since 4.11 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 267, "pos_bol": 11413, "pos_cnum": 11417 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 283, "pos_bol": 12070, "pos_cnum": 12092 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 267, "pos_bol": 11413, "pos_cnum": 11417 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 283, "pos_bol": 12070, "pos_cnum": 12092 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 267, "pos_bol": 11413, "pos_cnum": 11417 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 283, "pos_bol": 12070, "pos_cnum": 12092 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 267, "pos_bol": 11413, "pos_cnum": 11417 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 283, "pos_bol": 12070, "pos_cnum": 12092 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11354 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11412 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11354 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 266, "pos_bol": 11350, "pos_cnum": 11412 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12102 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12111 }, "loc_ghost": false }, "txt2": "partition" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12116 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12119 }, "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/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12123 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12125 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12129 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12133 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12123 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12133 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12116 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12133 }, "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/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12138 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12140 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12138 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12142 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12146 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12146 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12150 }, "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/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12155 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12146 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12138 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12113 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12157 }, "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", " [partition ~f m] returns a pair of maps [(m1, m2)], where\n [m1] contains all the bindings of [m] that satisfy the\n predicate [f], and [m2] is the map with all the bindings of\n [m] that do not satisfy [f].\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 286, "pos_bol": 12158, "pos_cnum": 12162 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 290, "pos_bol": 12392, "pos_cnum": 12414 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 286, "pos_bol": 12158, "pos_cnum": 12162 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 290, "pos_bol": 12392, "pos_cnum": 12414 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 286, "pos_bol": 12158, "pos_cnum": 12162 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 290, "pos_bol": 12392, "pos_cnum": 12414 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 286, "pos_bol": 12158, "pos_cnum": 12162 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 290, "pos_bol": 12392, "pos_cnum": 12414 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12098 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12157 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12098 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 285, "pos_bol": 12094, "pos_cnum": 12157 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12424 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12429 }, "loc_ghost": false }, "txt2": "split" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12431 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12434 }, "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/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12438 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12440 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12438 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12442 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12446 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12448 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12446 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12450 }, "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/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12453 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12455 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12453 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12462 }, "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/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12465 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12467 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12465 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12469 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12446 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12469 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12438 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12469 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12431 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12469 }, "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", " [split x m] returns a triple [(l, data, r)], where\n [l] is the map with all the bindings of [m] whose key\n is strictly less than [x];\n [r] is the map with all the bindings of [m] whose key\n is strictly greater than [x];\n [data] is [None] if [m] contains no binding for [x],\n or [Some v] if [m] binds [v] to [x].\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 293, "pos_bol": 12470, "pos_cnum": 12474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 300, "pos_bol": 12840, "pos_cnum": 12862 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 293, "pos_bol": 12470, "pos_cnum": 12474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 300, "pos_bol": 12840, "pos_cnum": 12862 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 293, "pos_bol": 12470, "pos_cnum": 12474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 300, "pos_bol": 12840, "pos_cnum": 12862 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 293, "pos_bol": 12470, "pos_cnum": 12474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 300, "pos_bol": 12840, "pos_cnum": 12862 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12420 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12469 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12420 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 292, "pos_bol": 12416, "pos_cnum": 12469 }, "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:predicates Predicates and comparisons} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12916 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12916 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12916 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12916 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12868 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 302, "pos_bol": 12864, "pos_cnum": 12916 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12926 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12934 }, "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/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12936 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12938 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12936 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12940 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12944 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12948 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12936 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12948 }, "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", " Test whether a map is empty or not. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12953 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12995 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12953 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12995 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12953 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12995 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12953 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 305, "pos_bol": 12949, "pos_cnum": 12995 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12948 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12922 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 304, "pos_bol": 12918, "pos_cnum": 12948 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13005 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13008 }, "loc_ghost": false }, "txt2": "mem" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13010 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13013 }, "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/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13017 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13019 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13017 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13021 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13025 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13029 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13017 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13029 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13010 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13029 }, "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 x m] returns [true] if [m] contains a binding for [x],\n and [false] otherwise. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 308, "pos_bol": 13030, "pos_cnum": 13034 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 309, "pos_bol": 13098, "pos_cnum": 13131 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 308, "pos_bol": 13030, "pos_cnum": 13034 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 309, "pos_bol": 13098, "pos_cnum": 13131 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 308, "pos_bol": 13030, "pos_cnum": 13034 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 309, "pos_bol": 13098, "pos_cnum": 13131 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 308, "pos_bol": 13030, "pos_cnum": 13034 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 309, "pos_bol": 13098, "pos_cnum": 13131 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13029 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13001 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 307, "pos_bol": 12997, "pos_cnum": 13029 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13141 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13146 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "cmp" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13155 }, "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/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13159 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13161 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13165 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13159 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13153 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13169 }, "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/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13174 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13174 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13178 }, "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/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13182 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13184 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13182 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13186 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13190 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13194 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13182 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13194 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13174 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13194 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13148 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13194 }, "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 ~cmp m1 m2] tests whether the maps [m1] and [m2] are\n equal, that is, contain equal keys and associate them with\n equal data. [cmp] is the equality predicate used to compare\n the data associated with the keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 312, "pos_bol": 13195, "pos_cnum": 13199 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 315, "pos_bol": 13399, "pos_cnum": 13444 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 312, "pos_bol": 13195, "pos_cnum": 13199 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 315, "pos_bol": 13399, "pos_cnum": 13444 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 312, "pos_bol": 13195, "pos_cnum": 13199 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 315, "pos_bol": 13399, "pos_cnum": 13444 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 312, "pos_bol": 13195, "pos_cnum": 13199 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 315, "pos_bol": 13399, "pos_cnum": 13444 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13137 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13194 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13137 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 311, "pos_bol": 13133, "pos_cnum": 13194 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13454 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13461 }, "loc_ghost": false }, "txt2": "compare" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "cmp" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13468 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13470 }, "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/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13476 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13480 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13483 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13474 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13483 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13468 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13483 }, "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/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13488 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13488 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13492 }, "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/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13496 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13498 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13496 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13500 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13504 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13496 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13488 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13463 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13507 }, "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", " Total ordering between maps. The first argument is a total ordering\n used to compare data associated with equal keys in the two maps. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 318, "pos_bol": 13508, "pos_cnum": 13512 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 319, "pos_bol": 13585, "pos_cnum": 13660 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 318, "pos_bol": 13508, "pos_cnum": 13512 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 319, "pos_bol": 13585, "pos_cnum": 13660 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 318, "pos_bol": 13508, "pos_cnum": 13512 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 319, "pos_bol": 13585, "pos_cnum": 13660 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 318, "pos_bol": 13508, "pos_cnum": 13512 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 319, "pos_bol": 13585, "pos_cnum": 13660 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13450 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13507 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13450 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 317, "pos_bol": 13446, "pos_cnum": 13507 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13670 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13677 }, "loc_ghost": false }, "txt2": "for_all" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13682 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13685 }, "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/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13689 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13691 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13695 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13699 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13689 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13699 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13682 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13699 }, "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/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13704 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13704 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13708 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13712 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13716 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13704 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13716 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13679 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13716 }, "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 m] checks if all the bindings of the map\n satisfy the predicate [f].\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 322, "pos_bol": 13717, "pos_cnum": 13721 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 324, "pos_bol": 13813, "pos_cnum": 13835 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 322, "pos_bol": 13717, "pos_cnum": 13721 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 324, "pos_bol": 13813, "pos_cnum": 13835 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 322, "pos_bol": 13717, "pos_cnum": 13721 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 324, "pos_bol": 13813, "pos_cnum": 13835 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 322, "pos_bol": 13717, "pos_cnum": 13721 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 324, "pos_bol": 13813, "pos_cnum": 13835 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13666 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13716 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13666 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 321, "pos_bol": 13662, "pos_cnum": 13716 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13845 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13851 }, "loc_ghost": false }, "txt2": "exists" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13856 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13859 }, "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/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13863 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13865 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13869 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13873 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13863 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13873 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13856 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13873 }, "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/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13878 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13878 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13882 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13886 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13890 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13878 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13890 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13853 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13890 }, "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 m] checks if at least one binding of the map\n satisfies the predicate [f].\n @since 3.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 327, "pos_bol": 13891, "pos_cnum": 13895 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 329, "pos_bol": 13992, "pos_cnum": 14014 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 327, "pos_bol": 13891, "pos_cnum": 13895 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 329, "pos_bol": 13992, "pos_cnum": 14014 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 327, "pos_bol": 13891, "pos_cnum": 13895 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 329, "pos_bol": 13992, "pos_cnum": 14014 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 327, "pos_bol": 13891, "pos_cnum": 13895 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 329, "pos_bol": 13992, "pos_cnum": 14014 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13841 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13890 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13841 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 326, "pos_bol": 13837, "pos_cnum": 13890 }, "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:converting Converting} ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14052 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14052 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14052 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14052 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14020 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 331, "pos_bol": 14016, "pos_cnum": 14052 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14062 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14069 }, "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/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14072 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14074 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14072 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14076 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14081 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14087 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14089 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14081 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14089 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14080 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14095 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14072 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14095 }, "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 m] is {!bindings}[ m].\n @since 5.1 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 334, "pos_bol": 14096, "pos_cnum": 14100 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 335, "pos_bol": 14136, "pos_cnum": 14157 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 334, "pos_bol": 14096, "pos_cnum": 14100 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 335, "pos_bol": 14136, "pos_cnum": 14157 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 334, "pos_bol": 14096, "pos_cnum": 14100 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 335, "pos_bol": 14136, "pos_cnum": 14157 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 334, "pos_bol": 14096, "pos_cnum": 14100 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 335, "pos_bol": 14136, "pos_cnum": 14157 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14058 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14095 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14058 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 333, "pos_bol": 14054, "pos_cnum": 14095 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14167 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14174 }, "loc_ghost": false }, "txt2": "of_list" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14178 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14181 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14184 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14186 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14178 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14186 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14177 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14192 }, "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/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14196 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14198 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14196 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14200 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14177 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14200 }, "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 bs] adds the bindings of [bs] to the empty map,\n in list order (if a key is bound twice in [bs] the last one\n takes over).\n @since 5.1 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 338, "pos_bol": 14201, "pos_cnum": 14205 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 341, "pos_bol": 14355, "pos_cnum": 14376 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 338, "pos_bol": 14201, "pos_cnum": 14205 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 341, "pos_bol": 14355, "pos_cnum": 14376 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 338, "pos_bol": 14201, "pos_cnum": 14205 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 341, "pos_bol": 14355, "pos_cnum": 14376 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 338, "pos_bol": 14201, "pos_cnum": 14205 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 341, "pos_bol": 14355, "pos_cnum": 14376 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14163 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14200 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14163 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 337, "pos_bol": 14159, "pos_cnum": 14200 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14386 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14392 }, "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/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14395 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14397 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14395 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14399 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14404 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14407 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14410 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14412 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14404 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14412 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14403 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14395 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14419 }, "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", " Iterate on the whole map, in ascending order of keys\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 344, "pos_bol": 14420, "pos_cnum": 14424 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 345, "pos_bol": 14481, "pos_cnum": 14503 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 344, "pos_bol": 14420, "pos_cnum": 14424 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 345, "pos_bol": 14481, "pos_cnum": 14503 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 344, "pos_bol": 14420, "pos_cnum": 14424 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 345, "pos_bol": 14481, "pos_cnum": 14503 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 344, "pos_bol": 14420, "pos_cnum": 14424 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 345, "pos_bol": 14481, "pos_cnum": 14503 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14382 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14419 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14382 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 343, "pos_bol": 14378, "pos_cnum": 14419 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14513 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14523 }, "loc_ghost": false }, "txt2": "to_rev_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/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14526 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14528 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14526 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14530 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14535 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14538 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14541 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14543 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14535 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14543 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14534 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14550 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14526 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14550 }, "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", " Iterate on the whole map, in descending order of keys\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 348, "pos_bol": 14551, "pos_cnum": 14555 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 349, "pos_bol": 14613, "pos_cnum": 14635 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 348, "pos_bol": 14551, "pos_cnum": 14555 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 349, "pos_bol": 14613, "pos_cnum": 14635 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 348, "pos_bol": 14551, "pos_cnum": 14555 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 349, "pos_bol": 14613, "pos_cnum": 14635 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 348, "pos_bol": 14551, "pos_cnum": 14555 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 349, "pos_bol": 14613, "pos_cnum": 14635 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14509 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14550 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14509 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 347, "pos_bol": 14505, "pos_cnum": 14550 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14645 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14656 }, "loc_ghost": false }, "txt2": "to_seq_from" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14659 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14662 }, "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/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14668 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14670 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14675 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14678 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14681 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14683 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14675 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14683 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14674 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14690 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14666 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14690 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14659 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14690 }, "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_from k m] iterates on a subset of the bindings of [m],\n in ascending order of keys, from key [k] or above.\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 352, "pos_bol": 14691, "pos_cnum": 14695 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 354, "pos_bol": 14821, "pos_cnum": 14843 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 352, "pos_bol": 14691, "pos_cnum": 14695 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 354, "pos_bol": 14821, "pos_cnum": 14843 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 352, "pos_bol": 14691, "pos_cnum": 14695 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 354, "pos_bol": 14821, "pos_cnum": 14843 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 352, "pos_bol": 14691, "pos_cnum": 14695 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 354, "pos_bol": 14821, "pos_cnum": 14843 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14641 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14690 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14641 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 351, "pos_bol": 14637, "pos_cnum": 14690 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14853 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14860 }, "loc_ghost": false }, "txt2": "add_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14864 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14867 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14870 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14864 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14863 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14879 }, "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/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14883 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14885 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14883 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14887 }, "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/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14891 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14893 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14891 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14895 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14883 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14895 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14863 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14895 }, "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 the given bindings to the map, in order.\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 357, "pos_bol": 14896, "pos_cnum": 14900 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 358, "pos_bol": 14949, "pos_cnum": 14971 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 357, "pos_bol": 14896, "pos_cnum": 14900 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 358, "pos_bol": 14949, "pos_cnum": 14971 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 357, "pos_bol": 14896, "pos_cnum": 14900 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 358, "pos_bol": 14949, "pos_cnum": 14971 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 357, "pos_bol": 14896, "pos_cnum": 14900 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 358, "pos_bol": 14949, "pos_cnum": 14971 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14849 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14895 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14849 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 356, "pos_bol": 14845, "pos_cnum": 14895 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14981 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14987 }, "loc_ghost": false }, "txt2": "of_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14991 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14994 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14997 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14999 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14991 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14999 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14990 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15006 }, "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/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15010 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15012 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15010 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15014 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14990 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15014 }, "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", " Build a map from the given bindings\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 361, "pos_bol": 15015, "pos_cnum": 15019 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 362, "pos_bol": 15059, "pos_cnum": 15081 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 361, "pos_bol": 15015, "pos_cnum": 15019 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 362, "pos_bol": 15059, "pos_cnum": 15081 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 361, "pos_bol": 15015, "pos_cnum": 15019 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 362, "pos_bol": 15059, "pos_cnum": 15081 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 361, "pos_bol": 15015, "pos_cnum": 15019 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 362, "pos_bol": 15059, "pos_cnum": 15081 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14977 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15014 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 14977 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 360, "pos_bol": 14973, "pos_cnum": 15014 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 66, "pos_bol": 2818, "pos_cnum": 2820 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 363, "pos_bol": 15082, "pos_cnum": 15087 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmtd_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", " Output signature of the functor {!Make}. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15088 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15135 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15088 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15135 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15088 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15135 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15088 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 364, "pos_bol": 15088, "pos_cnum": 15135 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 65, "pos_bol": 2802, "pos_cnum": 2802 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 363, "pos_bol": 15082, "pos_cnum": 15087 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 65, "pos_bol": 2802, "pos_cnum": 2802 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 363, "pos_bol": 15082, "pos_cnum": 15087 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15144 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15148 }, "loc_ghost": false }, "txt2": "Make" }, "pmd_type": { "pmty_desc": [ "Pmty_functor", [ "Named", { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15150 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15153 }, "loc_ghost": false }, "txt2": "Ord" }, { "pmty_desc": [ "Pmty_ident", "OrderedType" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15156 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15167 }, "loc_ghost": false }, "pmty_attributes": [] } ], { "pmty_desc": [ "Pmty_with", { "pmty_desc": [ "Pmty_ident", "S" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15171 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15172 }, "loc_ghost": false }, "pmty_attributes": [] }, [ [ "Pwith_type", "key", { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15183 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15186 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "Ordt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15189 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15194 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15178 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15194 }, "loc_ghost": false } } ] ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15171 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15194 }, "loc_ghost": false }, "pmty_attributes": [] } ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15149 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15194 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmd_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", " Functor building an implementation of the map structure\n given a totally ordered type. ", { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 367, "pos_bol": 15195, "pos_cnum": 15195 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 368, "pos_bol": 15255, "pos_cnum": 15290 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 367, "pos_bol": 15195, "pos_cnum": 15195 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 368, "pos_bol": 15255, "pos_cnum": 15290 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 367, "pos_bol": 15195, "pos_cnum": 15195 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 368, "pos_bol": 15255, "pos_cnum": 15290 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 367, "pos_bol": 15195, "pos_cnum": 15195 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 368, "pos_bol": 15255, "pos_cnum": 15290 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15137 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15194 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15137 }, "loc_end": { "pos_fname": "./stdlib/templates/map.template.mli", "pos_lnum": 366, "pos_bol": 15137, "pos_cnum": 15194 }, "loc_ghost": false } } ]