[ { "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", " Hash tables and hash functions.\n\n Hash tables are hashed association tables, with in-place modification.\n Because most operations on a hash table modify their input, they're\n more commonly used in imperative code. The lookup of the value associated\n with a key (see {!find}, {!find_opt}) is normally very fast, often faster\n than the equivalent lookup in {!Map}.\n\n The functors {!Make} and {!MakeSeeded} can be used when\n performance or flexibility are key.\n The user provides custom equality and hash functions for the key type,\n and obtains a custom hash table type for this particular type of key.\n\n {b Warning} a hash table is only as good as the hash function. A bad hash\n function will turn the table into a degenerate association list,\n with linear time lookup instead of constant time lookup.\n\n The polymorphic {!t} hash table is useful in simpler cases or\n in interactive environments. It uses the polymorphic {!hash} function\n defined in the OCaml runtime (at the time of writing, it's SipHash),\n as well as the polymorphic equality [(=)].\n\n See {{!examples} the examples section}.\n", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 19, "pos_bol": 1225, "pos_cnum": 1225 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 42, "pos_bol": 2355, "pos_cnum": 2357 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 19, "pos_bol": 1225, "pos_cnum": 1225 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 42, "pos_bol": 2355, "pos_cnum": 2357 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 19, "pos_bol": 1225, "pos_cnum": 1225 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 42, "pos_bol": 2355, "pos_cnum": 2357 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 19, "pos_bol": 1225, "pos_cnum": 1225 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 42, "pos_bol": 2355, "pos_cnum": 2357 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 19, "pos_bol": 1225, "pos_cnum": 1225 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 42, "pos_bol": 2355, "pos_cnum": 2357 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {b Unsynchronized accesses} ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2393 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2393 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2393 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2393 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 44, "pos_bol": 2359, "pos_cnum": 2393 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2399 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2406 }, "loc_ghost": false }, "txt2": "warning" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", "-53", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2408 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2411 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2407 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2412 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2407 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2412 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2395 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2413 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2395 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 46, "pos_bol": 2395, "pos_cnum": 2413 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2418 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2423 }, "loc_ghost": false }, "txt2": "alert" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_apply", { "pexp_desc": [ "Pexp_ident", "unsynchronized_access" ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2424 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2445 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [ [ [ "Nolabel" ], { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", "Unsynchronized accesses to hash tables are a programming error.", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 48, "pos_bol": 2446, "pos_cnum": 2451 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 48, "pos_bol": 2446, "pos_cnum": 2514 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 48, "pos_bol": 2446, "pos_cnum": 2450 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 48, "pos_bol": 2446, "pos_cnum": 2515 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] } ] ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2424 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 48, "pos_bol": 2446, "pos_cnum": 2515 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2424 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 48, "pos_bol": 2446, "pos_cnum": 2515 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2414 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 49, "pos_bol": 2516, "pos_cnum": 2517 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 47, "pos_bol": 2414, "pos_cnum": 2414 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 49, "pos_bol": 2516, "pos_cnum": 2517 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2522 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2529 }, "loc_ghost": false }, "txt2": "warning" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", "+53", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2531 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2534 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2530 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2535 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2530 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2535 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2518 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2536 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2518 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 50, "pos_bol": 2518, "pos_cnum": 2536 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", "\n Unsynchronized accesses to a hash table may lead to an invalid hash table\n state. Thus, concurrent accesses to a hash tables must be synchronized\n (for instance with a {!Mutex.t}).\n", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 52, "pos_bol": 2538, "pos_cnum": 2539 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 56, "pos_bol": 2734, "pos_cnum": 2736 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 52, "pos_bol": 2538, "pos_cnum": 2539 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 56, "pos_bol": 2734, "pos_cnum": 2736 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 52, "pos_bol": 2538, "pos_cnum": 2539 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 56, "pos_bol": 2734, "pos_cnum": 2736 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 52, "pos_bol": 2538, "pos_cnum": 2539 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 56, "pos_bol": 2734, "pos_cnum": 2736 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 52, "pos_bol": 2538, "pos_cnum": 2539 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 56, "pos_bol": 2734, "pos_cnum": 2736 }, "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 Generic interface} ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2739 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2767 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2739 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2767 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2739 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2767 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2739 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2767 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2739 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 59, "pos_bol": 2739, "pos_cnum": 2767 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2786 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2787 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2777 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2779 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2784 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The type of hash tables from type ['a] to type ['b]. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2788 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2847 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2788 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2847 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2788 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2847 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2788 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 63, "pos_bol": 2788, "pos_cnum": 2847 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2770 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2787 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2770 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 62, "pos_bol": 2770, "pos_cnum": 2787 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2853 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2859 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Optional", "random" ], { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2907 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2911 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2928 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2931 }, "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/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2936 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2938 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2940 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2942 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2935 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2945 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2928 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2945 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2862 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2945 }, "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", " [Hashtbl.create n] creates a new, empty hash table, with\n initial size [n]. For best results, [n] should be on the\n order of the expected number of elements that will be in\n the table. The table grows as needed, so [n] is just an\n initial guess.\n\n The optional [~random] parameter (a boolean) controls whether\n the internal organization of the hash table is randomized at each\n execution of [Hashtbl.create] or deterministic over all executions.\n\n A hash table that is created with [~random] set to [false] uses a\n fixed hash function ({!hash}) to distribute keys among\n buckets. As a consequence, collisions between keys happen\n deterministically. In Web-facing applications or other\n security-sensitive applications, the deterministic collision\n patterns can be exploited by a malicious user to create a\n denial-of-service attack: the attacker sends input crafted to\n create many collisions in the table, slowing the application down.\n\n A hash table that is created with [~random] set to [true] uses the seeded\n hash function {!seeded_hash} with a seed that is randomly chosen at hash\n table creation time. In effect, the hash function used is randomly\n selected among [2^{30}] different hash functions. All these hash\n functions have different collision patterns, rendering ineffective the\n denial-of-service attack described above. However, because of\n randomization, enumerating all elements of the hash table using {!fold}\n or {!iter} is no longer deterministic: elements are enumerated in\n different orders at different runs of the program.\n\n If no [~random] parameter is given, hash tables are created\n in non-random mode by default. This default can be changed\n either programmatically by calling {!randomize} or by\n setting the [R] flag in the [OCAMLRUNPARAM] environment variable.\n\n @before 4.00 the [~random] parameter was not present and all\n hash tables were created in non-randomized mode. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 67, "pos_bol": 2946, "pos_cnum": 2946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 102, "pos_bol": 4871, "pos_cnum": 4925 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 67, "pos_bol": 2946, "pos_cnum": 2946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 102, "pos_bol": 4871, "pos_cnum": 4925 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 67, "pos_bol": 2946, "pos_cnum": 2946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 102, "pos_bol": 4871, "pos_cnum": 4925 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 67, "pos_bol": 2946, "pos_cnum": 2946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 102, "pos_bol": 4871, "pos_cnum": 4925 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2849 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2945 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 65, "pos_bol": 2849, "pos_cnum": 2849 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 66, "pos_bol": 2915, "pos_cnum": 2945 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4931 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4936 }, "loc_ghost": false }, "txt2": "clear" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4940 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4942 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4944 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4946 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4939 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4949 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4953 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4957 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4939 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4957 }, "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", " Empty a hash table. Use [reset] instead of [clear] to shrink the\n size of the bucket table to its initial size. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 105, "pos_bol": 4958, "pos_cnum": 4958 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 106, "pos_bol": 5027, "pos_cnum": 5079 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 105, "pos_bol": 4958, "pos_cnum": 4958 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 106, "pos_bol": 5027, "pos_cnum": 5079 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 105, "pos_bol": 4958, "pos_cnum": 4958 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 106, "pos_bol": 5027, "pos_cnum": 5079 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 105, "pos_bol": 4958, "pos_cnum": 4958 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 106, "pos_bol": 5027, "pos_cnum": 5079 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4927 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4957 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4927 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 104, "pos_bol": 4927, "pos_cnum": 4957 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5085 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5090 }, "loc_ghost": false }, "txt2": "reset" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5094 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5096 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5098 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5100 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5093 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5107 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5111 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5093 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5111 }, "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", " Empty a hash table and shrink the size of the bucket table\n to its initial size.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 109, "pos_bol": 5112, "pos_cnum": 5112 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 111, "pos_bol": 5200, "pos_cnum": 5218 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 109, "pos_bol": 5112, "pos_cnum": 5112 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 111, "pos_bol": 5200, "pos_cnum": 5218 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 109, "pos_bol": 5112, "pos_cnum": 5112 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 111, "pos_bol": 5200, "pos_cnum": 5218 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 109, "pos_bol": 5112, "pos_cnum": 5112 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 111, "pos_bol": 5200, "pos_cnum": 5218 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5081 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5111 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5081 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 108, "pos_bol": 5081, "pos_cnum": 5111 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5224 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5228 }, "loc_ghost": false }, "txt2": "copy" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5232 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5234 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5236 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5238 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5231 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5241 }, "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/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5246 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5248 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5250 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5252 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5245 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5255 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5231 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5255 }, "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 a copy of the given hashtable. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5256 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5300 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5256 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5300 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5256 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5300 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5256 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 114, "pos_bol": 5256, "pos_cnum": 5300 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5255 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 113, "pos_bol": 5220, "pos_cnum": 5255 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5306 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5309 }, "loc_ghost": false }, "txt2": "add" }, "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/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5313 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5315 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5319 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5312 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5322 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5330 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5332 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5341 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5347 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5351 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5336 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5351 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5326 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5351 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5312 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5351 }, "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", " [Hashtbl.add tbl ~key ~data] adds a binding of [key] to [data]\n in table [tbl].\n\n {b Warning}: Previous bindings for [key] are not removed, but simply\n hidden. That is, after performing {!remove}[ tbl key],\n the previous binding for [key], if any, is restored.\n (Same behavior as with association lists.)\n\n If you desire the classic behavior of replacing elements,\n see {!replace}. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 117, "pos_bol": 5352, "pos_cnum": 5352 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 126, "pos_bol": 5733, "pos_cnum": 5754 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 117, "pos_bol": 5352, "pos_cnum": 5352 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 126, "pos_bol": 5733, "pos_cnum": 5754 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 117, "pos_bol": 5352, "pos_cnum": 5352 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 126, "pos_bol": 5733, "pos_cnum": 5754 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 117, "pos_bol": 5352, "pos_cnum": 5352 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 126, "pos_bol": 5733, "pos_cnum": 5754 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5302 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5351 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5302 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 116, "pos_bol": 5302, "pos_cnum": 5351 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5760 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5764 }, "loc_ghost": false }, "txt2": "find" }, "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/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5768 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5770 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5772 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5774 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5767 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5777 }, "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/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5781 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5783 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5787 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5789 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5781 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5789 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5767 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5789 }, "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", " [Hashtbl.find tbl x] returns the current binding of [x] in [tbl],\n or raises [Not_found] if no such binding exists. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 129, "pos_bol": 5790, "pos_cnum": 5790 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 130, "pos_bol": 5860, "pos_cnum": 5914 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 129, "pos_bol": 5790, "pos_cnum": 5790 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 130, "pos_bol": 5860, "pos_cnum": 5914 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 129, "pos_bol": 5790, "pos_cnum": 5790 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 130, "pos_bol": 5860, "pos_cnum": 5914 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 129, "pos_bol": 5790, "pos_cnum": 5790 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 130, "pos_bol": 5860, "pos_cnum": 5914 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5756 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5789 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5756 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 128, "pos_bol": 5756, "pos_cnum": 5789 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5920 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5928 }, "loc_ghost": false }, "txt2": "find_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/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5932 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5934 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5936 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5938 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5931 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5941 }, "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/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5945 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5947 }, "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/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5951 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5953 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5951 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5960 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5945 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5960 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5931 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5960 }, "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", " [Hashtbl.find_opt tbl x] returns the current binding of [x] in [tbl],\n or [None] if no such binding exists.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 133, "pos_bol": 5961, "pos_cnum": 5961 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 135, "pos_bol": 6076, "pos_cnum": 6094 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 133, "pos_bol": 5961, "pos_cnum": 5961 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 135, "pos_bol": 6076, "pos_cnum": 6094 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 133, "pos_bol": 5961, "pos_cnum": 5961 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 135, "pos_bol": 6076, "pos_cnum": 6094 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 133, "pos_bol": 5961, "pos_cnum": 5961 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 135, "pos_bol": 6076, "pos_cnum": 6094 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5916 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5960 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5916 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 132, "pos_bol": 5916, "pos_cnum": 5960 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6100 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6108 }, "loc_ghost": false }, "txt2": "find_all" }, "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/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6112 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6114 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6116 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6118 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6111 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6121 }, "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/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6125 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6127 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6131 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6133 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6131 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6138 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6125 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6138 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6111 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6138 }, "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", " [Hashtbl.find_all tbl x] returns the list of all data\n associated with [x] in [tbl].\n The current binding is returned first, then the previous\n bindings, in reverse order of introduction in the table. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 138, "pos_bol": 6139, "pos_cnum": 6139 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 141, "pos_bol": 6290, "pos_cnum": 6352 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 138, "pos_bol": 6139, "pos_cnum": 6139 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 141, "pos_bol": 6290, "pos_cnum": 6352 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 138, "pos_bol": 6139, "pos_cnum": 6139 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 141, "pos_bol": 6290, "pos_cnum": 6352 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 138, "pos_bol": 6139, "pos_cnum": 6139 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 141, "pos_bol": 6290, "pos_cnum": 6352 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6096 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6138 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6096 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 137, "pos_bol": 6096, "pos_cnum": 6138 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6358 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6361 }, "loc_ghost": false }, "txt2": "mem" }, "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/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6365 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6367 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6369 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6371 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6364 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6374 }, "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/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6378 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6380 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6384 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6388 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6378 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6388 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6364 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6388 }, "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", " [Hashtbl.mem tbl x] checks if [x] is bound in [tbl]. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6448 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6448 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6448 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 144, "pos_bol": 6389, "pos_cnum": 6448 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6354 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6388 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6354 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 143, "pos_bol": 6354, "pos_cnum": 6388 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6454 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6460 }, "loc_ghost": false }, "txt2": "remove" }, "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/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6464 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6466 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6468 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6463 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6473 }, "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/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6477 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6479 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6483 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6487 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6477 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6487 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6463 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6487 }, "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", " [Hashtbl.remove tbl x] removes the current binding of [x] in [tbl],\n restoring the previous binding if it exists.\n It does nothing if [x] is not bound in [tbl]. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 147, "pos_bol": 6488, "pos_cnum": 6488 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 149, "pos_bol": 6608, "pos_cnum": 6659 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 147, "pos_bol": 6488, "pos_cnum": 6488 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 149, "pos_bol": 6608, "pos_cnum": 6659 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 147, "pos_bol": 6488, "pos_cnum": 6488 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 149, "pos_bol": 6608, "pos_cnum": 6659 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 147, "pos_bol": 6488, "pos_cnum": 6488 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 149, "pos_bol": 6608, "pos_cnum": 6659 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6450 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6487 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6450 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 146, "pos_bol": 6450, "pos_cnum": 6487 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6665 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6672 }, "loc_ghost": false }, "txt2": "replace" }, "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/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6676 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6678 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6680 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6682 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6675 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6685 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6693 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6710 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6714 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6699 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6714 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6689 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6714 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6675 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6714 }, "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", " [Hashtbl.replace tbl ~key ~data] replaces the current binding of [key]\n in [tbl] by a binding of [key] to [data]. If [key] is unbound in [tbl],\n a binding of [key] to [data] is added to [tbl].\n This is functionally equivalent to {!remove}[ tbl key]\n followed by {!add}[ tbl key data]. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 152, "pos_bol": 6715, "pos_cnum": 6715 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 156, "pos_bol": 6975, "pos_cnum": 7015 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 152, "pos_bol": 6715, "pos_cnum": 6715 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 156, "pos_bol": 6975, "pos_cnum": 7015 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 152, "pos_bol": 6715, "pos_cnum": 6715 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 156, "pos_bol": 6975, "pos_cnum": 7015 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 152, "pos_bol": 6715, "pos_cnum": 6715 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 156, "pos_bol": 6975, "pos_cnum": 7015 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6661 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6714 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6661 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 151, "pos_bol": 6661, "pos_cnum": 6714 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7021 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7025 }, "loc_ghost": false }, "txt2": "iter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7035 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7046 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7048 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7052 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7056 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7041 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7056 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7031 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7056 }, "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/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7062 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7064 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7066 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7068 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7061 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7071 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7075 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7079 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7061 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7079 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7028 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7079 }, "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", " [Hashtbl.iter ~f tbl] applies [f] to all bindings in table [tbl].\n [f] receives the key as first argument, and the associated value\n as second argument. Each binding is presented exactly once to [f].\n\n The order in which the bindings are passed to [f] is unspecified.\n However, if the table contains several bindings for the same key,\n they are passed to [f] in reverse order of introduction, that is,\n the most recent binding is passed first.\n\n If the hash table was created in non-randomized mode, the order\n in which the bindings are enumerated is reproducible between\n successive runs of the program, and even between minor versions\n of OCaml. For randomized hash tables, the order of enumeration\n is entirely random.\n\n The behavior is not specified if the hash table is modified\n by [f] during the iteration.\n", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 159, "pos_bol": 7080, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 176, "pos_bol": 7925, "pos_cnum": 7927 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 159, "pos_bol": 7080, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 176, "pos_bol": 7925, "pos_cnum": 7927 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 159, "pos_bol": 7080, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 176, "pos_bol": 7925, "pos_cnum": 7927 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 159, "pos_bol": 7080, "pos_cnum": 7080 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 176, "pos_bol": 7925, "pos_cnum": 7927 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7017 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7079 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7017 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 158, "pos_bol": 7017, "pos_cnum": 7079 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7933 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7951 }, "loc_ghost": false }, "txt2": "filter_map_inplace" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7960 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7962 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7971 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7973 }, "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/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7977 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7979 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7977 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7986 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7966 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7986 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7956 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7986 }, "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/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7992 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7994 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7996 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7998 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7991 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 8001 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 179, "pos_bol": 8005, "pos_cnum": 8009 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 179, "pos_bol": 8005, "pos_cnum": 8013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7991 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 179, "pos_bol": 8005, "pos_cnum": 8013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7953 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 179, "pos_bol": 8005, "pos_cnum": 8013 }, "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", " [Hashtbl.filter_map_inplace ~f tbl] applies [f] to all bindings in\n table [tbl] and update each binding depending on the result of\n [f]. If [f] returns [None], the binding is discarded. If it\n returns [Some new_val], the binding is update to associate the key\n to [new_val].\n\n Other comments for {!iter} apply as well.\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 180, "pos_bol": 8014, "pos_cnum": 8014 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 187, "pos_bol": 8354, "pos_cnum": 8372 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 180, "pos_bol": 8014, "pos_cnum": 8014 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 187, "pos_bol": 8354, "pos_cnum": 8372 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 180, "pos_bol": 8014, "pos_cnum": 8014 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 187, "pos_bol": 8354, "pos_cnum": 8372 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 180, "pos_bol": 8014, "pos_cnum": 8014 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 187, "pos_bol": 8354, "pos_cnum": 8372 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7929 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 179, "pos_bol": 8005, "pos_cnum": 8013 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 178, "pos_bol": 7929, "pos_cnum": 7929 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 179, "pos_bol": 8005, "pos_cnum": 8013 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 189, "pos_bol": 8374, "pos_cnum": 8378 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 189, "pos_bol": 8374, "pos_cnum": 8382 }, "loc_ghost": false }, "txt2": "fold" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8394 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8396 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "data" ], { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8405 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8407 }, "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/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8411 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8415 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8419 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8411 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8400 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8390 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8423 }, "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/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8429 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8431 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8433 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8435 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8428 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8438 }, "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/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8447 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8451 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8455 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8459 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8442 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8459 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8428 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8459 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8387 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8459 }, "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", " [Hashtbl.fold ~f tbl ~init] computes\n [(f kN dN ... (f k1 d1 init)...)],\n where [k1 ... kN] are the keys of all bindings in [tbl],\n and [d1 ... dN] are the associated values.\n Each binding is presented exactly once to [f].\n\n The order in which the bindings are passed to [f] is unspecified.\n However, if the table contains several bindings for the same key,\n they are passed to [f] in reverse order of introduction, that is,\n the most recent binding is passed first.\n\n If the hash table was created in non-randomized mode, the order\n in which the bindings are enumerated is reproducible between\n successive runs of the program, and even between minor versions\n of OCaml. For randomized hash tables, the order of enumeration\n is entirely random.\n\n The behavior is not specified if the hash table is modified\n by [f] during the iteration.\n", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 191, "pos_bol": 8460, "pos_cnum": 8460 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 210, "pos_bol": 9332, "pos_cnum": 9334 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 191, "pos_bol": 8460, "pos_cnum": 8460 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 210, "pos_bol": 9332, "pos_cnum": 9334 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 191, "pos_bol": 8460, "pos_cnum": 8460 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 210, "pos_bol": 9332, "pos_cnum": 9334 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 191, "pos_bol": 8460, "pos_cnum": 8460 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 210, "pos_bol": 9332, "pos_cnum": 9334 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 189, "pos_bol": 8374, "pos_cnum": 8374 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8459 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 189, "pos_bol": 8374, "pos_cnum": 8374 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 190, "pos_bol": 8385, "pos_cnum": 8459 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9340 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9346 }, "loc_ghost": false }, "txt2": "length" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9350 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9354 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9356 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9349 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9363 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9349 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9366 }, "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", " [Hashtbl.length tbl] returns the number of bindings in [tbl].\n It takes constant time. Multiple bindings are counted once each, so\n [Hashtbl.length] gives the number of times [Hashtbl.iter] calls its\n first argument. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 213, "pos_bol": 9367, "pos_cnum": 9367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 216, "pos_bol": 9576, "pos_cnum": 9597 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 213, "pos_bol": 9367, "pos_cnum": 9367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 216, "pos_bol": 9576, "pos_cnum": 9597 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 213, "pos_bol": 9367, "pos_cnum": 9367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 216, "pos_bol": 9576, "pos_cnum": 9597 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 213, "pos_bol": 9367, "pos_cnum": 9367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 216, "pos_bol": 9576, "pos_cnum": 9597 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9336 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9366 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9336 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 212, "pos_bol": 9336, "pos_cnum": 9366 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9603 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9612 }, "loc_ghost": false }, "txt2": "randomize" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9619 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9623 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9627 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9627 }, "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", " After a call to [Hashtbl.randomize()], hash tables are created in\n randomized mode by default: {!create} returns randomized\n hash tables, unless the [~random:false] optional parameter is given.\n The same effect can be achieved by setting the [R] parameter in\n the [OCAMLRUNPARAM] environment variable.\n\n It is recommended that applications or Web frameworks that need to\n protect themselves against the denial-of-service attack described\n in {!create} call [Hashtbl.randomize()] at initialization\n time before any domains are created.\n\n Note that once [Hashtbl.randomize()] was called, there is no way\n to revert to the non-randomized default behavior of {!create}.\n This is intentional. Non-randomized hash tables can still be\n created using [Hashtbl.create ~random:false].\n\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 219, "pos_bol": 9628, "pos_cnum": 9628 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 235, "pos_bol": 10445, "pos_cnum": 10463 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 219, "pos_bol": 9628, "pos_cnum": 9628 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 235, "pos_bol": 10445, "pos_cnum": 10463 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 219, "pos_bol": 9628, "pos_cnum": 9628 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 235, "pos_bol": 10445, "pos_cnum": 10463 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 219, "pos_bol": 9628, "pos_cnum": 9628 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 235, "pos_bol": 10445, "pos_cnum": 10463 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9599 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9627 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9599 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 218, "pos_bol": 9599, "pos_cnum": 9627 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10469 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10482 }, "loc_ghost": false }, "txt2": "is_randomized" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10485 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10489 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10493 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10497 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10485 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10497 }, "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 [true] if the tables are currently created in randomized mode\n by default, [false] otherwise.\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 238, "pos_bol": 10498, "pos_cnum": 10498 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 240, "pos_bol": 10606, "pos_cnum": 10624 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 238, "pos_bol": 10498, "pos_cnum": 10498 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 240, "pos_bol": 10606, "pos_cnum": 10624 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 238, "pos_bol": 10498, "pos_cnum": 10498 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 240, "pos_bol": 10606, "pos_cnum": 10624 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 238, "pos_bol": 10498, "pos_cnum": 10498 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 240, "pos_bol": 10606, "pos_cnum": 10624 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10465 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10497 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10465 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 237, "pos_bol": 10465, "pos_cnum": 10497 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10630 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10637 }, "loc_ghost": false }, "txt2": "rebuild" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Optional", "random" ], { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10685 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10689 }, "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/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10698 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10700 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10702 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10704 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10697 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10707 }, "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/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10712 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10714 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10716 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10718 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10711 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10721 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10697 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10721 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10640 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10721 }, "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 a copy of the given hashtable. Unlike {!copy},\n {!rebuild}[ h] re-hashes all the (key, value) entries of\n the original table [h]. The returned hash table is randomized if\n [h] was randomized, or the optional [random] parameter is true, or\n if the default is to create randomized hash tables; see\n {!create} for more information.\n\n {!rebuild} can safely be used to import a hash table built\n by an old version of the {!Hashtbl} module, then marshaled to\n persistent storage. After unmarshaling, apply {!rebuild}\n to produce a hash table for the current version of the {!Hashtbl}\n module.\n\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 244, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 257, "pos_bol": 11354, "pos_cnum": 11372 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 244, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 257, "pos_bol": 11354, "pos_cnum": 11372 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 244, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 257, "pos_bol": 11354, "pos_cnum": 11372 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 244, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 257, "pos_bol": 11354, "pos_cnum": 11372 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10626 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10721 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 242, "pos_bol": 10626, "pos_cnum": 10626 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 243, "pos_bol": 10693, "pos_cnum": 10721 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 260, "pos_bol": 11393, "pos_cnum": 11398 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 260, "pos_bol": 11393, "pos_cnum": 11408 }, "loc_ghost": false }, "txt2": "statistics" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_record", [ { "pld_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 261, "pos_bol": 11413, "pos_cnum": 11415 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 261, "pos_bol": 11413, "pos_cnum": 11427 }, "loc_ghost": false }, "txt2": "num_bindings" }, "pld_mutable": [ "Immutable" ], "pld_type": { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 261, "pos_bol": 11413, "pos_cnum": 11429 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 261, "pos_bol": 11413, "pos_cnum": 11432 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pld_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 261, "pos_bol": 11413, "pos_cnum": 11415 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 261, "pos_bol": 11413, "pos_cnum": 11433 }, "loc_ghost": false }, "pld_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", " Number of bindings present in the table.\n Same value as returned by {!length}. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 262, "pos_bol": 11434, "pos_cnum": 11438 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 263, "pos_bol": 11483, "pos_cnum": 11530 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 262, "pos_bol": 11434, "pos_cnum": 11438 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 263, "pos_bol": 11483, "pos_cnum": 11530 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 262, "pos_bol": 11434, "pos_cnum": 11438 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 263, "pos_bol": 11483, "pos_cnum": 11530 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 262, "pos_bol": 11434, "pos_cnum": 11438 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 263, "pos_bol": 11483, "pos_cnum": 11530 }, "loc_ghost": false } } ] }, { "pld_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 264, "pos_bol": 11531, "pos_cnum": 11533 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 264, "pos_bol": 11531, "pos_cnum": 11544 }, "loc_ghost": false }, "txt2": "num_buckets" }, "pld_mutable": [ "Immutable" ], "pld_type": { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 264, "pos_bol": 11531, "pos_cnum": 11546 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 264, "pos_bol": 11531, "pos_cnum": 11549 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pld_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 264, "pos_bol": 11531, "pos_cnum": 11533 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 264, "pos_bol": 11531, "pos_cnum": 11550 }, "loc_ghost": false }, "pld_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", " Number of buckets in the table. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11555 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11593 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11555 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11593 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11555 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11593 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11555 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 265, "pos_bol": 11551, "pos_cnum": 11593 }, "loc_ghost": false } } ] }, { "pld_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 266, "pos_bol": 11594, "pos_cnum": 11596 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 266, "pos_bol": 11594, "pos_cnum": 11613 }, "loc_ghost": false }, "txt2": "max_bucket_length" }, "pld_mutable": [ "Immutable" ], "pld_type": { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 266, "pos_bol": 11594, "pos_cnum": 11615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 266, "pos_bol": 11594, "pos_cnum": 11618 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pld_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 266, "pos_bol": 11594, "pos_cnum": 11596 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 266, "pos_bol": 11594, "pos_cnum": 11619 }, "loc_ghost": false }, "pld_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", " Maximal number of bindings per bucket. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11669 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11669 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11669 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 267, "pos_bol": 11620, "pos_cnum": 11669 }, "loc_ghost": false } } ] }, { "pld_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11672 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11688 }, "loc_ghost": false }, "txt2": "bucket_histogram" }, "pld_mutable": [ "Immutable" ], "pld_type": { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11690 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11693 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11690 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11699 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pld_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11672 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 268, "pos_bol": 11670, "pos_cnum": 11699 }, "loc_ghost": false }, "pld_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", " Histogram of bucket sizes. This array [histo] has\n length [max_bucket_length + 1]. The value of\n [histo.(i)] is the number of buckets whose size is [i]. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 269, "pos_bol": 11700, "pos_cnum": 11704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 271, "pos_bol": 11813, "pos_cnum": 11879 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 269, "pos_bol": 11700, "pos_cnum": 11704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 271, "pos_bol": 11813, "pos_cnum": 11879 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 269, "pos_bol": 11700, "pos_cnum": 11704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 271, "pos_bol": 11813, "pos_cnum": 11879 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 269, "pos_bol": 11700, "pos_cnum": 11704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 271, "pos_bol": 11813, "pos_cnum": 11879 }, "loc_ghost": false } } ] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11374 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11392 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11374 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11392 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11374 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11392 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11374 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 259, "pos_bol": 11374, "pos_cnum": 11392 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 260, "pos_bol": 11393, "pos_cnum": 11393 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 272, "pos_bol": 11880, "pos_cnum": 11881 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 260, "pos_bol": 11393, "pos_cnum": 11393 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 272, "pos_bol": 11880, "pos_cnum": 11881 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11887 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11892 }, "loc_ghost": false }, "txt2": "stats" }, "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/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11896 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11898 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11900 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11902 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11895 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11905 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "statistics", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11909 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11919 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11895 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11919 }, "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", " [Hashtbl.stats tbl] returns statistics about the table [tbl]:\n number of buckets, size of the biggest bucket, distribution of\n buckets by size.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 275, "pos_bol": 11920, "pos_cnum": 11920 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 278, "pos_bol": 12072, "pos_cnum": 12089 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 275, "pos_bol": 11920, "pos_cnum": 11920 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 278, "pos_bol": 12072, "pos_cnum": 12089 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 275, "pos_bol": 11920, "pos_cnum": 11920 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 278, "pos_bol": 12072, "pos_cnum": 12089 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 275, "pos_bol": 11920, "pos_cnum": 11920 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 278, "pos_bol": 12072, "pos_cnum": 12089 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11883 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11919 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11883 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 274, "pos_bol": 11883, "pos_cnum": 11919 }, "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 Hash tables and Sequences} ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12091 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12127 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12091 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12127 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12091 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12127 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12091 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12127 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12091 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 280, "pos_bol": 12091, "pos_cnum": 12127 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12133 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12139 }, "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/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12143 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12146 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12142 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12151 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12156 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12161 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12163 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12156 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12163 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12155 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12170 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12142 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12170 }, "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 table. The order in which the bindings\n appear in the sequence is unspecified. However, if the table contains\n several bindings for the same key, they appear in reversed order of\n introduction, that is, the most recent binding appears first.\n\n The behavior is not specified if the hash table is modified\n during the iteration.\n\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 283, "pos_bol": 12171, "pos_cnum": 12171 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 291, "pos_bol": 12540, "pos_cnum": 12558 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 283, "pos_bol": 12171, "pos_cnum": 12171 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 291, "pos_bol": 12540, "pos_cnum": 12558 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 283, "pos_bol": 12171, "pos_cnum": 12171 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 291, "pos_bol": 12540, "pos_cnum": 12558 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 283, "pos_bol": 12171, "pos_cnum": 12171 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 291, "pos_bol": 12540, "pos_cnum": 12558 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12129 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12170 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12129 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 282, "pos_bol": 12129, "pos_cnum": 12170 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12564 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12575 }, "loc_ghost": false }, "txt2": "to_seq_keys" }, "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/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12579 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12581 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_any" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12582 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12583 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12578 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12586 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12590 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12592 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12590 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12598 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12578 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12598 }, "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 [Seq.map fst (to_seq m)]\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 294, "pos_bol": 12599, "pos_cnum": 12599 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 295, "pos_bol": 12636, "pos_cnum": 12654 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 294, "pos_bol": 12599, "pos_cnum": 12599 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 295, "pos_bol": 12636, "pos_cnum": 12654 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 294, "pos_bol": 12599, "pos_cnum": 12599 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 295, "pos_bol": 12636, "pos_cnum": 12654 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 294, "pos_bol": 12599, "pos_cnum": 12599 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 295, "pos_bol": 12636, "pos_cnum": 12654 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12560 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12598 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12560 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 293, "pos_bol": 12560, "pos_cnum": 12598 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12660 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12673 }, "loc_ghost": false }, "txt2": "to_seq_values" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_any" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12677 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12678 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12679 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12681 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12676 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12684 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12688 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12690 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12688 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12696 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12676 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12696 }, "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 [Seq.map snd (to_seq m)]\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 298, "pos_bol": 12697, "pos_cnum": 12697 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 299, "pos_bol": 12734, "pos_cnum": 12752 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 298, "pos_bol": 12697, "pos_cnum": 12697 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 299, "pos_bol": 12734, "pos_cnum": 12752 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 298, "pos_bol": 12697, "pos_cnum": 12697 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 299, "pos_bol": 12734, "pos_cnum": 12752 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 298, "pos_bol": 12697, "pos_cnum": 12697 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 299, "pos_bol": 12734, "pos_cnum": 12752 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12656 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12696 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12656 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 297, "pos_bol": 12656, "pos_cnum": 12696 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12758 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12765 }, "loc_ghost": false }, "txt2": "add_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/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12769 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12772 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12774 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12768 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12777 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12784 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12787 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12789 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12789 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12781 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12796 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12800 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12781 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12768 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12804 }, "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 table, using {!add}\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12805 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 303, "pos_bol": 12859, "pos_cnum": 12877 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12805 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 303, "pos_bol": 12859, "pos_cnum": 12877 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12805 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 303, "pos_bol": 12859, "pos_cnum": 12877 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12805 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 303, "pos_bol": 12859, "pos_cnum": 12877 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12754 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12804 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12754 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 301, "pos_bol": 12754, "pos_cnum": 12804 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12883 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12894 }, "loc_ghost": false }, "txt2": "replace_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/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12898 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12900 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12901 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12903 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12897 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12906 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12911 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12913 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12916 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12918 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12911 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12918 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12910 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12925 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12929 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12910 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12897 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12933 }, "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 table, using {!replace}\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 306, "pos_bol": 12934, "pos_cnum": 12934 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 307, "pos_bol": 12992, "pos_cnum": 13010 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 306, "pos_bol": 12934, "pos_cnum": 12934 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 307, "pos_bol": 12992, "pos_cnum": 13010 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 306, "pos_bol": 12934, "pos_cnum": 12934 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 307, "pos_bol": 12992, "pos_cnum": 13010 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 306, "pos_bol": 12934, "pos_cnum": 12934 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 307, "pos_bol": 12992, "pos_cnum": 13010 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12879 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12933 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12879 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 305, "pos_bol": 12879, "pos_cnum": 12933 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13016 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13022 }, "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_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13026 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13028 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13031 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13026 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13025 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13040 }, "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/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13045 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13047 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13049 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13051 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13044 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13054 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13025 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13054 }, "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 table from the given bindings. The bindings are added\n in the same order they appear in the sequence, using {!replace_seq},\n which means that if two pairs have the same key, only the latest one\n will appear in the table.\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 310, "pos_bol": 13055, "pos_cnum": 13055 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 314, "pos_bol": 13297, "pos_cnum": 13315 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 310, "pos_bol": 13055, "pos_cnum": 13055 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 314, "pos_bol": 13297, "pos_cnum": 13315 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 310, "pos_bol": 13055, "pos_cnum": 13055 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 314, "pos_bol": 13297, "pos_cnum": 13315 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 310, "pos_bol": 13055, "pos_cnum": 13055 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 314, "pos_bol": 13297, "pos_cnum": 13315 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13012 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13054 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13012 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 309, "pos_bol": 13012, "pos_cnum": 13054 }, "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 Functorial interface} ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13348 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13348 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13348 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13348 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 316, "pos_bol": 13317, "pos_cnum": 13348 }, "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", " The functorial interface allows the use of specific comparison\n and hash functions, either for performance/security concerns,\n or because keys are not hashable/comparable with the polymorphic builtins.\n\n For instance, one might want to specialize a table for integer keys:\n {[\n module IntHash =\n struct\n type t = int\n let equal i j = i=j\n let hash i = i land max_int\n end\n\n module IntHashtbl = Hashtbl.Make(IntHash)\n\n let h = IntHashtbl.create 17 in\n IntHashtbl.add h 12 \"hello\"\n ]}\n\n This creates a new module [IntHashtbl], with a new type ['a\n IntHashtbl.t] of tables from [int] to ['a]. In this example, [h]\n contains [string] values so its type is [string IntHashtbl.t].\n\n Note that the new type ['a IntHashtbl.t] is not compatible with\n the type [('a,'b) Hashtbl.t] of the generic interface. For\n example, [Hashtbl.length h] would not type-check, you must use\n [IntHashtbl.length].\n", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 318, "pos_bol": 13350, "pos_cnum": 13350 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 345, "pos_bol": 14338, "pos_cnum": 14340 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 318, "pos_bol": 13350, "pos_cnum": 13350 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 345, "pos_bol": 14338, "pos_cnum": 14340 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 318, "pos_bol": 13350, "pos_cnum": 13350 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 345, "pos_bol": 14338, "pos_cnum": 14340 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 318, "pos_bol": 13350, "pos_cnum": 13350 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 345, "pos_bol": 14338, "pos_cnum": 14340 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 318, "pos_bol": 13350, "pos_cnum": 13350 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 345, "pos_bol": 14338, "pos_cnum": 14340 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 347, "pos_bol": 14342, "pos_cnum": 14354 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 347, "pos_bol": 14342, "pos_cnum": 14364 }, "loc_ghost": false }, "txt2": "HashedType" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 349, "pos_bol": 14373, "pos_cnum": 14382 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 349, "pos_bol": 14373, "pos_cnum": 14383 }, "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 hashtable keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14388 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14426 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14388 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14426 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14388 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14426 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14388 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 350, "pos_bol": 14384, "pos_cnum": 14426 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 349, "pos_bol": 14373, "pos_cnum": 14377 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 349, "pos_bol": 14373, "pos_cnum": 14383 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 349, "pos_bol": 14373, "pos_cnum": 14377 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 349, "pos_bol": 14373, "pos_cnum": 14383 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14436 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14441 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14444 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14445 }, "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/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14449 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14450 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14454 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14458 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14449 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14458 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14444 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14458 }, "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 equality predicate used to compare keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14463 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14514 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14463 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14514 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14463 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14514 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14463 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 353, "pos_bol": 14459, "pos_cnum": 14514 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14432 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14458 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14432 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 352, "pos_bol": 14428, "pos_cnum": 14458 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14524 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14528 }, "loc_ghost": false }, "txt2": "hash" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14531 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14532 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14536 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14539 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14531 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14539 }, "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 hashing function on keys. It must be such that if two keys are\n equal according to [equal], then they have identical hash values\n as computed by [hash].\n Examples: suitable ([equal], [hash]) pairs for arbitrary key\n types include\n- ([(=)], {!hash}) for comparing objects by structure\n (provided objects do not contain floats)\n- ([(fun x y -> compare x y = 0)], {!hash})\n for comparing objects by structure\n and handling {!Stdlib.nan} correctly\n- ([(==)], {!hash}) for comparing objects by physical\n equality (e.g. for mutable or cyclic objects). ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 356, "pos_bol": 14540, "pos_cnum": 14546 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 367, "pos_bol": 15149, "pos_cnum": 15212 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 356, "pos_bol": 14540, "pos_cnum": 14546 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 367, "pos_bol": 15149, "pos_cnum": 15212 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 356, "pos_bol": 14540, "pos_cnum": 14546 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 367, "pos_bol": 15149, "pos_cnum": 15212 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 356, "pos_bol": 14540, "pos_cnum": 14546 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 367, "pos_bol": 15149, "pos_cnum": 15212 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14520 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14539 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14520 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 355, "pos_bol": 14516, "pos_cnum": 14539 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 348, "pos_bol": 14367, "pos_cnum": 14369 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 368, "pos_bol": 15213, "pos_cnum": 15219 }, "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", " The input signature of the functor {!Make}. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15270 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15270 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15270 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 369, "pos_bol": 15220, "pos_cnum": 15270 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 347, "pos_bol": 14342, "pos_cnum": 14342 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 368, "pos_bol": 15213, "pos_cnum": 15219 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 347, "pos_bol": 14342, "pos_cnum": 14342 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 368, "pos_bol": 15213, "pos_cnum": 15219 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 371, "pos_bol": 15272, "pos_cnum": 15284 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 371, "pos_bol": 15272, "pos_cnum": 15285 }, "loc_ghost": false }, "txt2": "S" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 373, "pos_bol": 15294, "pos_cnum": 15303 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 373, "pos_bol": 15294, "pos_cnum": 15306 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 373, "pos_bol": 15294, "pos_cnum": 15298 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 373, "pos_bol": 15294, "pos_cnum": 15306 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 373, "pos_bol": 15294, "pos_cnum": 15298 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 373, "pos_bol": 15294, "pos_cnum": 15306 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15320 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15321 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15317 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15319 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15311 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15321 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15311 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 374, "pos_bol": 15307, "pos_cnum": 15321 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15330 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15336 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15339 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15342 }, "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/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15346 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15348 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15346 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15339 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15326 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15350 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15326 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 375, "pos_bol": 15322, "pos_cnum": 15350 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15364 }, "loc_ghost": false }, "txt2": "clear" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15369 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15371 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15375 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15367 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15355 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15379 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15355 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 376, "pos_bol": 15351, "pos_cnum": 15379 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15388 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15393 }, "loc_ghost": false }, "txt2": "reset" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15396 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15398 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15396 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15400 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15404 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15408 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15396 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15408 }, "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", " @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15409 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15427 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15409 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15427 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15409 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15427 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15409 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15427 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15384 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15408 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15384 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 377, "pos_bol": 15380, "pos_cnum": 15408 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15437 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15441 }, "loc_ghost": false }, "txt2": "copy" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15444 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15444 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15448 }, "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/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15452 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15454 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15452 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15456 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15444 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15456 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15433 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15456 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15433 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 379, "pos_bol": 15429, "pos_cnum": 15456 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15465 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15468 }, "loc_ghost": false }, "txt2": "add" }, "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/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15471 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15473 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15471 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15475 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15483 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15486 }, "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/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15495 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15497 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15501 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15505 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15490 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15505 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15479 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15505 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15471 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15505 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15461 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15505 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15461 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 380, "pos_bol": 15457, "pos_cnum": 15505 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15514 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15520 }, "loc_ghost": false }, "txt2": "remove" }, "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/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15523 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15525 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15523 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15527 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15531 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15534 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15538 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15531 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15523 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15510 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15542 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15510 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 381, "pos_bol": 15506, "pos_cnum": 15542 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15551 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15555 }, "loc_ghost": false }, "txt2": "find" }, "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/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15558 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15558 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15562 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15566 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15569 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15573 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15575 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15566 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15575 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15558 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15575 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15547 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15575 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15547 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 382, "pos_bol": 15543, "pos_cnum": 15575 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15584 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15592 }, "loc_ghost": false }, "txt2": "find_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/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15595 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15597 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15595 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15599 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15603 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15606 }, "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/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15610 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15612 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15610 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15619 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15603 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15619 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15595 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15619 }, "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", " @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15642 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15642 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15642 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15624 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 384, "pos_bol": 15620, "pos_cnum": 15642 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15580 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15619 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15580 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 383, "pos_bol": 15576, "pos_cnum": 15619 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15652 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15660 }, "loc_ghost": false }, "txt2": "find_all" }, "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/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15663 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15665 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15663 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15667 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15671 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15674 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15678 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15680 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15678 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15685 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15671 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15685 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15663 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15685 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15648 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15685 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15648 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 386, "pos_bol": 15644, "pos_cnum": 15685 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15694 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15701 }, "loc_ghost": false }, "txt2": "replace" }, "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/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15708 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15716 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15719 }, "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/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15728 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15730 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15734 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15738 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15723 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15738 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15712 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15738 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15704 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15738 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15690 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15738 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15690 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 387, "pos_bol": 15686, "pos_cnum": 15738 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15747 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15750 }, "loc_ghost": false }, "txt2": "mem" }, "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/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15753 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15755 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15753 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15757 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15761 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15764 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15768 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15772 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15761 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15772 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15753 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15772 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15743 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15772 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15743 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 388, "pos_bol": 15739, "pos_cnum": 15772 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15781 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15785 }, "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/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15795 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15798 }, "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/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15807 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15809 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15813 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15817 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15802 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15817 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15791 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15817 }, "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/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15822 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15824 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15822 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15826 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15830 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15834 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15822 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15834 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15788 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15834 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15777 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15834 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15777 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 389, "pos_bol": 15773, "pos_cnum": 15834 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15843 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15861 }, "loc_ghost": false }, "txt2": "filter_map_inplace" }, "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/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15870 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15873 }, "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/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15882 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15884 }, "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/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15888 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15890 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15888 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15877 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15866 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15897 }, "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/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15902 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15904 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15902 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15906 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 391, "pos_bol": 15910, "pos_cnum": 15916 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 391, "pos_bol": 15910, "pos_cnum": 15920 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15902 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 391, "pos_bol": 15910, "pos_cnum": 15920 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15863 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 391, "pos_bol": 15910, "pos_cnum": 15920 }, "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", " @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15925 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15943 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15925 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15943 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15925 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15943 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15925 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 392, "pos_bol": 15921, "pos_cnum": 15943 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15839 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 391, "pos_bol": 15910, "pos_cnum": 15920 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 390, "pos_bol": 15835, "pos_cnum": 15839 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 391, "pos_bol": 15910, "pos_cnum": 15920 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 394, "pos_bol": 15945, "pos_cnum": 15953 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 394, "pos_bol": 15945, "pos_cnum": 15957 }, "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/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15973 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15976 }, "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/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15985 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15987 }, "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/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15991 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15995 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15999 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16003 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15991 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16003 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15980 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16003 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15969 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16003 }, "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/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16008 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16010 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16008 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16012 }, "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/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16021 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16025 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16029 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16016 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16008 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 15966 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16033 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 394, "pos_bol": 15945, "pos_cnum": 15949 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16033 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 394, "pos_bol": 15945, "pos_cnum": 15949 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 395, "pos_bol": 15960, "pos_cnum": 16033 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16042 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16048 }, "loc_ghost": false }, "txt2": "length" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16051 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16053 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16051 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16055 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16059 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16051 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16038 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16062 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16038 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 396, "pos_bol": 16034, "pos_cnum": 16062 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16071 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16076 }, "loc_ghost": false }, "txt2": "stats" }, "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/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16078 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16080 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16078 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16082 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "statistics", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16086 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16096 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16078 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16096 }, "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", " @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16097 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16115 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16097 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16115 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16097 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16115 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16097 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16115 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16067 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16096 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16067 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 397, "pos_bol": 16063, "pos_cnum": 16096 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16125 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16131 }, "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/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16134 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16136 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16134 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16138 }, "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/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16143 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16146 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16149 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16151 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16143 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16151 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16142 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16134 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16158 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16181 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16181 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16181 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 400, "pos_bol": 16159, "pos_cnum": 16181 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16121 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16158 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16121 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 399, "pos_bol": 16117, "pos_cnum": 16158 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16191 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16202 }, "loc_ghost": false }, "txt2": "to_seq_keys" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_any" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16205 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16205 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16208 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16212 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16215 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16212 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16221 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16205 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16221 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16244 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16244 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16244 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 403, "pos_bol": 16222, "pos_cnum": 16244 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16187 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16221 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16187 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 402, "pos_bol": 16183, "pos_cnum": 16221 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16254 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16267 }, "loc_ghost": false }, "txt2": "to_seq_values" }, "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/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16270 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16272 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16270 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16274 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16278 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16280 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16278 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16286 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16270 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16286 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16291 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16309 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16291 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16309 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16291 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16309 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16291 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 406, "pos_bol": 16287, "pos_cnum": 16309 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16250 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16286 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16250 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 405, "pos_bol": 16246, "pos_cnum": 16286 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16319 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16326 }, "loc_ghost": false }, "txt2": "add_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/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16329 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16329 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16333 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "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/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16338 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16341 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16344 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16346 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16338 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16346 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16337 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16357 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16361 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16337 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16361 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16329 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16361 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16366 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16384 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16366 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16384 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16366 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16384 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16366 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 409, "pos_bol": 16362, "pos_cnum": 16384 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16315 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16361 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16315 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 408, "pos_bol": 16311, "pos_cnum": 16361 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16394 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16405 }, "loc_ghost": false }, "txt2": "replace_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/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16408 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16410 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16408 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16412 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "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/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16417 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16420 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16423 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16425 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16417 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16425 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16416 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16432 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16436 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16440 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16416 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16440 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16408 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16440 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16445 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16463 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16445 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16463 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16445 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16463 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16445 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 412, "pos_bol": 16441, "pos_cnum": 16463 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16390 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16440 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16390 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 411, "pos_bol": 16386, "pos_cnum": 16440 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16473 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16479 }, "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/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16483 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16486 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16489 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16491 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16483 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16491 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16482 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16498 }, "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/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16502 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16504 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16502 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16506 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16482 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16506 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16511 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16529 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16511 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16529 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16511 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16529 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16511 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 415, "pos_bol": 16507, "pos_cnum": 16529 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16469 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16506 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16469 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 414, "pos_bol": 16465, "pos_cnum": 16506 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 372, "pos_bol": 15288, "pos_cnum": 15290 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 416, "pos_bol": 16530, "pos_cnum": 16535 }, "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", " The output signature of the functor {!Make}. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16536 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16587 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16536 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16587 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16536 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16587 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16536 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 417, "pos_bol": 16536, "pos_cnum": 16587 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 371, "pos_bol": 15272, "pos_cnum": 15272 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 416, "pos_bol": 16530, "pos_cnum": 16535 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 371, "pos_bol": 15272, "pos_cnum": 15272 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 416, "pos_bol": 16530, "pos_cnum": 16535 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16596 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16600 }, "loc_ghost": false }, "txt2": "Make" }, "pmd_type": { "pmty_desc": [ "Pmty_functor", [ "Named", { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16602 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16603 }, "loc_ghost": false }, "txt2": "H" }, { "pmty_desc": [ "Pmty_ident", "HashedType" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16606 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16616 }, "loc_ghost": false }, "pmty_attributes": [] } ], { "pmty_desc": [ "Pmty_with", { "pmty_desc": [ "Pmty_ident", "S" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16620 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16621 }, "loc_ghost": false }, "pmty_attributes": [] }, [ [ "Pwith_type", "key", { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16632 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16635 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "Ht", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16638 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16641 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16627 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16641 }, "loc_ghost": false } } ] ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16620 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16641 }, "loc_ghost": false }, "pmty_attributes": [] } ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16601 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16641 }, "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 hashtable structure.\n The functor [Hashtbl.Make] returns a structure containing\n a type [key] of keys and a type ['a t] of hash tables\n associating data of type ['a] to keys of type [key].\n The operations perform similarly to those of the generic\n interface, but use the hashing and equality functions\n specified in the functor argument [H] instead of generic\n equality and hashing. Since the hash function is not seeded,\n the [create] operation of the result structure always returns\n non-randomized hash tables. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 420, "pos_bol": 16642, "pos_cnum": 16642 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 429, "pos_bol": 17198, "pos_cnum": 17232 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 420, "pos_bol": 16642, "pos_cnum": 16642 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 429, "pos_bol": 17198, "pos_cnum": 17232 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 420, "pos_bol": 16642, "pos_cnum": 16642 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 429, "pos_bol": 17198, "pos_cnum": 17232 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 420, "pos_bol": 16642, "pos_cnum": 16642 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 429, "pos_bol": 17198, "pos_cnum": 17232 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16589 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16641 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16589 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 419, "pos_bol": 16589, "pos_cnum": 16641 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 431, "pos_bol": 17234, "pos_cnum": 17246 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 431, "pos_bol": 17234, "pos_cnum": 17262 }, "loc_ghost": false }, "txt2": "SeededHashedType" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 433, "pos_bol": 17271, "pos_cnum": 17280 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 433, "pos_bol": 17271, "pos_cnum": 17281 }, "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 hashtable keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17286 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17324 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17286 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17324 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17286 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17324 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17286 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 434, "pos_bol": 17282, "pos_cnum": 17324 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 433, "pos_bol": 17271, "pos_cnum": 17275 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 433, "pos_bol": 17271, "pos_cnum": 17281 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 433, "pos_bol": 17271, "pos_cnum": 17275 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 433, "pos_bol": 17271, "pos_cnum": 17281 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17334 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17339 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17341 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17342 }, "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/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17346 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17347 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17351 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17355 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17346 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17355 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17341 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17355 }, "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 equality predicate used to compare keys. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17360 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17411 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17360 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17411 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17360 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17411 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17360 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 437, "pos_bol": 17356, "pos_cnum": 17411 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17330 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17355 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17330 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 436, "pos_bol": 17326, "pos_cnum": 17355 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17421 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17432 }, "loc_ghost": false }, "txt2": "seeded_hash" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17434 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17437 }, "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/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17441 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17442 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17446 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17449 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17441 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17449 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17434 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17449 }, "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 seeded hashing function on keys. The first argument is\n the seed. It must be the case that if [equal x y] is true,\n then [seeded_hash seed x = seeded_hash seed y] for any value of\n [seed]. A suitable choice for [seeded_hash] is the function\n {!Hashtbl.seeded_hash} below. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 440, "pos_bol": 17450, "pos_cnum": 17456 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 444, "pos_bol": 17733, "pos_cnum": 17775 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 440, "pos_bol": 17450, "pos_cnum": 17456 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 444, "pos_bol": 17733, "pos_cnum": 17775 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 440, "pos_bol": 17450, "pos_cnum": 17456 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 444, "pos_bol": 17733, "pos_cnum": 17775 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 440, "pos_bol": 17450, "pos_cnum": 17456 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 444, "pos_bol": 17733, "pos_cnum": 17775 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17417 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17449 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17417 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 439, "pos_bol": 17413, "pos_cnum": 17449 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 432, "pos_bol": 17265, "pos_cnum": 17267 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 445, "pos_bol": 17776, "pos_cnum": 17781 }, "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", " The input signature of the functor {!MakeSeeded}.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 446, "pos_bol": 17782, "pos_cnum": 17782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 447, "pos_bol": 17836, "pos_cnum": 17854 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 446, "pos_bol": 17782, "pos_cnum": 17782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 447, "pos_bol": 17836, "pos_cnum": 17854 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 446, "pos_bol": 17782, "pos_cnum": 17782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 447, "pos_bol": 17836, "pos_cnum": 17854 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 446, "pos_bol": 17782, "pos_cnum": 17782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 447, "pos_bol": 17836, "pos_cnum": 17854 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 431, "pos_bol": 17234, "pos_cnum": 17234 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 445, "pos_bol": 17776, "pos_cnum": 17781 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 431, "pos_bol": 17234, "pos_cnum": 17234 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 445, "pos_bol": 17776, "pos_cnum": 17781 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 449, "pos_bol": 17856, "pos_cnum": 17868 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 449, "pos_bol": 17856, "pos_cnum": 17875 }, "loc_ghost": false }, "txt2": "SeededS" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 451, "pos_bol": 17884, "pos_cnum": 17893 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 451, "pos_bol": 17884, "pos_cnum": 17896 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 451, "pos_bol": 17884, "pos_cnum": 17888 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 451, "pos_bol": 17884, "pos_cnum": 17896 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 451, "pos_bol": 17884, "pos_cnum": 17888 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 451, "pos_bol": 17884, "pos_cnum": 17896 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17910 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17911 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17907 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17909 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17901 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17911 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17901 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 452, "pos_bol": 17897, "pos_cnum": 17911 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17920 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17926 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Optional", "random" ], { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17974 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 17999 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18002 }, "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/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18006 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18008 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18006 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18010 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 17999 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18010 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17929 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18010 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17916 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18010 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 453, "pos_bol": 17912, "pos_cnum": 17916 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 454, "pos_bol": 17982, "pos_cnum": 18010 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18019 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18024 }, "loc_ghost": false }, "txt2": "clear" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18027 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18029 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18027 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18031 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18035 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18039 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18027 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18039 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18015 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18039 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18015 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 455, "pos_bol": 18011, "pos_cnum": 18039 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18048 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18053 }, "loc_ghost": false }, "txt2": "reset" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18056 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18058 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18056 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18060 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18064 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18068 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18056 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18068 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18044 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18068 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18044 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 456, "pos_bol": 18040, "pos_cnum": 18068 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18077 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18081 }, "loc_ghost": false }, "txt2": "copy" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18084 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18086 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18084 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18088 }, "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/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18092 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18094 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18092 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18096 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18084 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18096 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18073 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18096 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18073 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 457, "pos_bol": 18069, "pos_cnum": 18096 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18105 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18108 }, "loc_ghost": false }, "txt2": "add" }, "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/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18111 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18113 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18111 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18115 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18123 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18126 }, "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/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18135 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18137 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18141 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18130 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18119 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18111 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18101 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18145 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18101 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 458, "pos_bol": 18097, "pos_cnum": 18145 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18154 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18160 }, "loc_ghost": false }, "txt2": "remove" }, "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/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18165 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18167 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18171 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18174 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18178 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18182 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18171 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18182 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18163 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18182 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18150 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18182 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18150 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 459, "pos_bol": 18146, "pos_cnum": 18182 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18191 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18195 }, "loc_ghost": false }, "txt2": "find" }, "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/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18198 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18200 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18198 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18202 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18206 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18209 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18213 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18215 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18206 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18215 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18198 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18215 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18187 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18215 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18187 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 460, "pos_bol": 18183, "pos_cnum": 18215 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18224 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18232 }, "loc_ghost": false }, "txt2": "find_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/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18235 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18235 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18239 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18243 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18246 }, "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/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18250 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18252 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18250 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18259 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18243 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18259 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18235 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18259 }, "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", " @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18260 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18278 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18260 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18278 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18260 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18278 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18260 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18278 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18259 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18220 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 461, "pos_bol": 18216, "pos_cnum": 18259 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18288 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18296 }, "loc_ghost": false }, "txt2": "find_all" }, "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/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18301 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18307 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18310 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18314 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18316 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18314 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18321 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18307 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18321 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18321 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18284 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18321 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18284 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 463, "pos_bol": 18280, "pos_cnum": 18321 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18330 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18337 }, "loc_ghost": false }, "txt2": "replace" }, "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/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18340 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18342 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18340 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18344 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "key" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18352 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18355 }, "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/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18364 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18370 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18374 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18359 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18374 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18348 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18374 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18340 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18374 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18326 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18374 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18326 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 464, "pos_bol": 18322, "pos_cnum": 18374 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18383 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18386 }, "loc_ghost": false }, "txt2": "mem" }, "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/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18391 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18393 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18397 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18400 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18404 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18408 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18397 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18408 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18389 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18408 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18379 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18408 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18379 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 465, "pos_bol": 18375, "pos_cnum": 18408 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18417 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18421 }, "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/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18431 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18434 }, "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/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18443 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18445 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18449 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18438 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18427 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18453 }, "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/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18458 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18460 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18458 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18462 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18466 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18458 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18424 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18413 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18470 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18413 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 466, "pos_bol": 18409, "pos_cnum": 18470 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18479 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18497 }, "loc_ghost": false }, "txt2": "filter_map_inplace" }, "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/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18506 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18509 }, "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/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18518 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18520 }, "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/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18524 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18526 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18524 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18513 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18502 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18533 }, "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/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18538 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18540 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18538 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 468, "pos_bol": 18546, "pos_cnum": 18552 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 468, "pos_bol": 18546, "pos_cnum": 18556 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18538 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 468, "pos_bol": 18546, "pos_cnum": 18556 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18499 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 468, "pos_bol": 18546, "pos_cnum": 18556 }, "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", " @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18561 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18579 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18561 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18579 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18561 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18579 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18561 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 469, "pos_bol": 18557, "pos_cnum": 18579 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18475 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 468, "pos_bol": 18546, "pos_cnum": 18556 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 467, "pos_bol": 18471, "pos_cnum": 18475 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 468, "pos_bol": 18546, "pos_cnum": 18556 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 471, "pos_bol": 18581, "pos_cnum": 18589 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 471, "pos_bol": 18581, "pos_cnum": 18593 }, "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/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18609 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18612 }, "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/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18621 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18623 }, "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/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18627 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18631 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18635 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18639 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18627 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18639 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18616 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18639 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18605 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18639 }, "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/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18644 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18646 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18644 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18648 }, "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/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18657 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18661 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18665 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18652 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18644 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18602 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 471, "pos_bol": 18581, "pos_cnum": 18585 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18669 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 471, "pos_bol": 18581, "pos_cnum": 18585 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 472, "pos_bol": 18596, "pos_cnum": 18669 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18678 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18684 }, "loc_ghost": false }, "txt2": "length" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18687 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18689 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18687 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18691 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18695 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18698 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18687 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18698 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18674 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18698 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18674 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 473, "pos_bol": 18670, "pos_cnum": 18698 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18707 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18712 }, "loc_ghost": false }, "txt2": "stats" }, "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/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18714 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18716 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18714 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18718 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "statistics", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18722 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18732 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18714 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18732 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18703 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18732 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18703 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 474, "pos_bol": 18699, "pos_cnum": 18732 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18742 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18748 }, "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/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18751 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18753 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18751 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18755 }, "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/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18760 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18763 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18766 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18768 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18760 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18768 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18759 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18775 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18751 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18775 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18780 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18798 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18780 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18798 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18780 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18798 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18780 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 477, "pos_bol": 18776, "pos_cnum": 18798 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18738 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18775 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18738 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 476, "pos_bol": 18734, "pos_cnum": 18775 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18808 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18819 }, "loc_ghost": false }, "txt2": "to_seq_keys" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_any" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18822 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18823 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18822 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18825 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_constr", "key", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18829 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18832 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18829 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18838 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18822 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18838 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18843 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18861 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18843 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18861 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18843 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18861 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18843 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 480, "pos_bol": 18839, "pos_cnum": 18861 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18804 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18838 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18804 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 479, "pos_bol": 18800, "pos_cnum": 18838 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18871 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18884 }, "loc_ghost": false }, "txt2": "to_seq_values" }, "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/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18887 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18889 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18887 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18891 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18895 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18895 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18903 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18887 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18903 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18926 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18926 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18926 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18908 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 483, "pos_bol": 18904, "pos_cnum": 18926 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18867 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18903 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18867 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 482, "pos_bol": 18863, "pos_cnum": 18903 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18936 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18943 }, "loc_ghost": false }, "txt2": "add_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/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18948 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18950 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "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/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18955 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18958 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18961 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18963 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18955 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18963 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18954 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18970 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18974 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18954 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18946 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18978 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 18983 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 19001 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 18983 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 19001 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 18983 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 19001 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 18983 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 486, "pos_bol": 18979, "pos_cnum": 19001 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18932 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18978 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18932 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 485, "pos_bol": 18928, "pos_cnum": 18978 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19011 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19022 }, "loc_ghost": false }, "txt2": "replace_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/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19025 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19027 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19025 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19029 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "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/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19034 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19040 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19042 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19034 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19042 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19033 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19049 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19053 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19057 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19033 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19057 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19025 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19057 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19062 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19080 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19062 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19080 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19062 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19080 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19062 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 489, "pos_bol": 19058, "pos_cnum": 19080 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19007 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19057 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19007 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 488, "pos_bol": 19003, "pos_cnum": 19057 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19090 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19096 }, "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/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19100 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19106 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19108 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19100 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19108 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19099 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19115 }, "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/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19119 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19121 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19119 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19123 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19099 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19123 }, "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", " @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19128 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19146 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19128 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19146 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19128 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19146 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19128 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 492, "pos_bol": 19124, "pos_cnum": 19146 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19086 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19123 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19086 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 491, "pos_bol": 19082, "pos_cnum": 19123 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 450, "pos_bol": 17878, "pos_cnum": 17880 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 493, "pos_bol": 19147, "pos_cnum": 19152 }, "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", " The output signature of the functor {!MakeSeeded}.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 494, "pos_bol": 19153, "pos_cnum": 19153 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 495, "pos_bol": 19208, "pos_cnum": 19226 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 494, "pos_bol": 19153, "pos_cnum": 19153 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 495, "pos_bol": 19208, "pos_cnum": 19226 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 494, "pos_bol": 19153, "pos_cnum": 19153 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 495, "pos_bol": 19208, "pos_cnum": 19226 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 494, "pos_bol": 19153, "pos_cnum": 19153 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 495, "pos_bol": 19208, "pos_cnum": 19226 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 449, "pos_bol": 17856, "pos_cnum": 17856 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 493, "pos_bol": 19147, "pos_cnum": 19152 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 449, "pos_bol": 17856, "pos_cnum": 17856 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 493, "pos_bol": 19147, "pos_cnum": 19152 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19235 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19245 }, "loc_ghost": false }, "txt2": "MakeSeeded" }, "pmd_type": { "pmty_desc": [ "Pmty_functor", [ "Named", { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19247 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19248 }, "loc_ghost": false }, "txt2": "H" }, { "pmty_desc": [ "Pmty_ident", "SeededHashedType" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19251 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19267 }, "loc_ghost": false }, "pmty_attributes": [] } ], { "pmty_desc": [ "Pmty_with", { "pmty_desc": [ "Pmty_ident", "SeededS" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19271 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19278 }, "loc_ghost": false }, "pmty_attributes": [] }, [ [ "Pwith_type", "key", { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19289 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19292 }, "loc_ghost": false }, "txt2": "key" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "Ht", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19295 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19298 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19284 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19298 }, "loc_ghost": false } } ] ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19271 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19298 }, "loc_ghost": false }, "pmty_attributes": [] } ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19246 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19298 }, "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 hashtable structure.\n The functor [Hashtbl.MakeSeeded] returns a structure containing\n a type [key] of keys and a type ['a t] of hash tables\n associating data of type ['a] to keys of type [key].\n The operations perform similarly to those of the generic\n interface, but use the seeded hashing and equality functions\n specified in the functor argument [H] instead of generic\n equality and hashing. The [create] operation of the\n result structure supports the [~random] optional parameter\n and returns randomized hash tables if [~random:true] is passed\n or if randomization is globally on (see {!Hashtbl.randomize}).\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 498, "pos_bol": 19299, "pos_cnum": 19299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 509, "pos_bol": 19990, "pos_cnum": 20008 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 498, "pos_bol": 19299, "pos_cnum": 19299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 509, "pos_bol": 19990, "pos_cnum": 20008 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 498, "pos_bol": 19299, "pos_cnum": 19299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 509, "pos_bol": 19990, "pos_cnum": 20008 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 498, "pos_bol": 19299, "pos_cnum": 19299 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 509, "pos_bol": 19990, "pos_cnum": 20008 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19228 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19298 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19228 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 497, "pos_bol": 19228, "pos_cnum": 19298 }, "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 The polymorphic hash functions} ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20011 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20052 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20011 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20052 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20011 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20052 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20011 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20052 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20011 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 512, "pos_bol": 20011, "pos_cnum": 20052 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20059 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20063 }, "loc_ghost": false }, "txt2": "hash" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20066 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20068 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20072 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20075 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20066 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20075 }, "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", " [Hashtbl.hash x] associates a nonnegative integer to any value of\n any type. It is guaranteed that\n if [x = y] or [Stdlib.compare x y = 0], then [hash x = hash y].\n Moreover, [hash] always terminates, even on cyclic structures. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 516, "pos_bol": 20076, "pos_cnum": 20076 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 519, "pos_bol": 20248, "pos_cnum": 20316 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 516, "pos_bol": 20076, "pos_cnum": 20076 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 519, "pos_bol": 20248, "pos_cnum": 20316 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 516, "pos_bol": 20076, "pos_cnum": 20076 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 519, "pos_bol": 20248, "pos_cnum": 20316 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 516, "pos_bol": 20076, "pos_cnum": 20076 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 519, "pos_bol": 20248, "pos_cnum": 20316 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20055 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20075 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20055 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 515, "pos_bol": 20055, "pos_cnum": 20075 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20322 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20333 }, "loc_ghost": false }, "txt2": "seeded_hash" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20336 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20339 }, "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/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20343 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20345 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20349 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20343 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20336 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20352 }, "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 variant of {!hash} that is further parameterized by\n an integer seed.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 522, "pos_bol": 20353, "pos_cnum": 20353 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 524, "pos_bol": 20431, "pos_cnum": 20448 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 522, "pos_bol": 20353, "pos_cnum": 20353 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 524, "pos_bol": 20431, "pos_cnum": 20448 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 522, "pos_bol": 20353, "pos_cnum": 20353 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 524, "pos_bol": 20431, "pos_cnum": 20448 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 522, "pos_bol": 20353, "pos_cnum": 20353 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 524, "pos_bol": 20431, "pos_cnum": 20448 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20318 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20352 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20318 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 521, "pos_bol": 20318, "pos_cnum": 20352 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20454 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20464 }, "loc_ghost": false }, "txt2": "hash_param" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20467 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20474 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20477 }, "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/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20481 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20483 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20487 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20481 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20474 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20467 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20490 }, "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", " [Hashtbl.hash_param meaningful total x] computes a hash value for [x],\n with the same properties as for [hash]. The two extra integer\n parameters [meaningful] and [total] give more precise control over\n hashing. Hashing performs a breadth-first, left-to-right traversal\n of the structure [x], stopping after [meaningful] meaningful nodes\n were encountered, or [total] nodes (meaningful or not) were\n encountered. If [total] as specified by the user exceeds a certain\n value, currently 256, then it is capped to that value.\n Meaningful nodes are: integers; floating-point\n numbers; strings; characters; booleans; and constant\n constructors. Larger values of [meaningful] and [total] means that\n more nodes are taken into account to compute the final hash value,\n and therefore collisions are less likely to happen. However,\n hashing takes longer. The parameters [meaningful] and [total]\n govern the tradeoff between accuracy and speed. As default\n choices, {!hash} and {!seeded_hash} take\n [meaningful = 10] and [total = 100]. ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 527, "pos_bol": 20491, "pos_cnum": 20491 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 543, "pos_bol": 21516, "pos_cnum": 21558 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 527, "pos_bol": 20491, "pos_cnum": 20491 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 543, "pos_bol": 21516, "pos_cnum": 21558 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 527, "pos_bol": 20491, "pos_cnum": 20491 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 543, "pos_bol": 21516, "pos_cnum": 21558 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 527, "pos_bol": 20491, "pos_cnum": 20491 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 543, "pos_bol": 21516, "pos_cnum": 21558 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20450 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20490 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20450 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 526, "pos_bol": 20450, "pos_cnum": 20490 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21564 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21581 }, "loc_ghost": false }, "txt2": "seeded_hash_param" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21584 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21587 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21591 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21594 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21598 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21601 }, "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/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21605 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21607 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21611 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21605 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21598 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21591 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21584 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "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 variant of {!hash_param} that is further parameterized by\n an integer seed. Usage:\n [Hashtbl.seeded_hash_param meaningful total seed x].\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 546, "pos_bol": 21615, "pos_cnum": 21615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 549, "pos_bol": 21763, "pos_cnum": 21780 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 546, "pos_bol": 21615, "pos_cnum": 21615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 549, "pos_bol": 21763, "pos_cnum": 21780 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 546, "pos_bol": 21615, "pos_cnum": 21615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 549, "pos_bol": 21763, "pos_cnum": 21780 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 546, "pos_bol": 21615, "pos_cnum": 21615 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 549, "pos_bol": 21763, "pos_cnum": 21780 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21560 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21560 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 545, "pos_bol": 21560, "pos_cnum": 21614 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {1:examples Examples}\n\n {2 Basic Example}\n\n {[\n (* 0...99 *)\n let seq = Seq.ints 0 |> Seq.take 100\n\n (* build from Seq.t *)\n # let tbl =\n seq\n |> Seq.map (fun x -> x, string_of_int x)\n |> Hashtbl.of_seq\n val tbl : (int, string) Hashtbl.t = \n\n # Hashtbl.length tbl\n - : int = 100\n\n # Hashtbl.find_opt tbl 32\n - : string option = Some \"32\"\n\n # Hashtbl.find_opt tbl 166\n - : string option = None\n\n # Hashtbl.replace tbl 166 \"one six six\"\n - : unit = ()\n\n # Hashtbl.find_opt tbl 166\n - : string option = Some \"one six six\"\n\n # Hashtbl.length tbl\n - : int = 101\n ]}\n\n\n {2 Counting Elements}\n\n Given a sequence of elements (here, a {!Seq.t}), we want to count how many\n times each distinct element occurs in the sequence. A simple way to do this,\n assuming the elements are comparable and hashable, is to use a hash table\n that maps elements to their number of occurrences.\n\n Here we illustrate that principle using a sequence of (ascii) characters\n (type [char]).\n We use a custom [Char_tbl] specialized for [char].\n\n {[\n # module Char_tbl = Hashtbl.Make(struct\n type t = char\n let equal = Char.equal\n let hash = Hashtbl.hash\n end)\n\n (* count distinct occurrences of chars in [seq] *)\n # let count_chars (seq : char Seq.t) : _ list =\n let counts = Char_tbl.create 16 in\n Seq.iter\n (fun c ->\n let count_c =\n Char_tbl.find_opt counts c\n |> Option.value ~default:0\n in\n Char_tbl.replace counts c (count_c + 1))\n seq;\n (* turn into a list *)\n Char_tbl.fold (fun c n l -> (c,n) :: l) counts []\n |> List.sort (fun (c1,_)(c2,_) -> Char.compare c1 c2)\n val count_chars : Char_tbl.key Seq.t -> (Char.t * int) list = \n\n (* basic seq from a string *)\n # let seq = String.to_seq \"hello world, and all the camels in it!\"\n val seq : char Seq.t = \n\n # count_chars seq\n - : (Char.t * int) list =\n [(' ', 7); ('!', 1); (',', 1); ('a', 3); ('c', 1); ('d', 2); ('e', 3);\n ('h', 2); ('i', 2); ('l', 6); ('m', 1); ('n', 2); ('o', 2); ('r', 1);\n ('s', 1); ('t', 2); ('w', 1)]\n\n (* \"abcabcabc...\" *)\n # let seq2 =\n Seq.cycle (String.to_seq \"abc\") |> Seq.take 31\n val seq2 : char Seq.t = \n\n # String.of_seq seq2\n - : String.t = \"abcabcabcabcabcabcabcabcabcabca\"\n\n # count_chars seq2\n - : (Char.t * int) list = [('a', 11); ('b', 10); ('c', 10)]\n\n ]}\n\n", { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 551, "pos_bol": 21782, "pos_cnum": 21782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 643, "pos_bol": 24323, "pos_cnum": 24325 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 551, "pos_bol": 21782, "pos_cnum": 21782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 643, "pos_bol": 24323, "pos_cnum": 24325 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 551, "pos_bol": 21782, "pos_cnum": 21782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 643, "pos_bol": 24323, "pos_cnum": 24325 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 551, "pos_bol": 21782, "pos_cnum": 21782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 643, "pos_bol": 24323, "pos_cnum": 24325 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 551, "pos_bol": 21782, "pos_cnum": 21782 }, "loc_end": { "pos_fname": "./stdlib/templates/hashtbl.template.mli", "pos_lnum": 643, "pos_bol": 24323, "pos_cnum": 24325 }, "loc_ghost": false } } ]