[ { "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", " Byte sequence operations.\n\n A byte sequence is a mutable data structure that contains a\n fixed-length sequence of bytes. Each byte can be indexed in\n constant time for reading or writing.\n\n Given a byte sequence [s] of length [l], we can access each of the\n [l] bytes of [s] via its index in the sequence. Indexes start at\n [0], and we will call an index valid in [s] if it falls within the\n range [[0...l-1]] (inclusive). A position is the point between two\n bytes or at the beginning or end of the sequence. We call a\n position valid in [s] if it falls within the range [[0...l]]\n (inclusive). Note that the byte at index [n] is between positions\n [n] and [n+1].\n\n Two parameters [start] and [len] are said to designate a valid\n range of [s] if [len >= 0] and [start] and [start+len] are valid\n positions in [s].\n\n Byte sequences can be modified in place, for instance via the [set]\n and [blit] functions described below. See also strings (module\n {!String}), which are almost the same data structure, but cannot be\n modified in place.\n\n Bytes are represented by the OCaml type [char].\n\n The labeled version of this module can be used as described in the\n {!StdLabels} module.\n\n @since 4.02\n\n ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 24, "pos_bol": 1290, "pos_cnum": 1290 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 55, "pos_bol": 2534, "pos_cnum": 2539 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 24, "pos_bol": 1290, "pos_cnum": 1290 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 55, "pos_bol": 2534, "pos_cnum": 2539 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 24, "pos_bol": 1290, "pos_cnum": 1290 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 55, "pos_bol": 2534, "pos_cnum": 2539 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 24, "pos_bol": 1290, "pos_cnum": 1290 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 55, "pos_bol": 2534, "pos_cnum": 2539 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 24, "pos_bol": 1290, "pos_cnum": 1290 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 55, "pos_bol": 2534, "pos_cnum": 2539 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2550 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2556 }, "loc_ghost": false }, "txt2": "length" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2559 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2564 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2568 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2571 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2559 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2571 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%bytes_length" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the length (number of bytes) of the argument. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2590 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2649 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2590 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2649 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2590 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2649 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2590 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 58, "pos_bol": 2590, "pos_cnum": 2649 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2541 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2589 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2541 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 57, "pos_bol": 2541, "pos_cnum": 2589 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2660 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2663 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2666 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2671 }, "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/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2678 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2682 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2686 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2686 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2666 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2686 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%bytes_safe_get" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get s n] returns the byte at index [n] in argument [s].\n @raise Invalid_argument if [n] is not a valid index in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 61, "pos_bol": 2707, "pos_cnum": 2707 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 62, "pos_bol": 2768, "pos_cnum": 2834 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 61, "pos_bol": 2707, "pos_cnum": 2707 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 62, "pos_bol": 2768, "pos_cnum": 2834 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 61, "pos_bol": 2707, "pos_cnum": 2707 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 62, "pos_bol": 2768, "pos_cnum": 2834 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 61, "pos_bol": 2707, "pos_cnum": 2707 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 62, "pos_bol": 2768, "pos_cnum": 2834 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2651 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2706 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2651 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2706 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2846 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2849 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2852 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2857 }, "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/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2861 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2868 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2876 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2868 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2861 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2852 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%bytes_safe_set" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set s n c] modifies [s] in place, replacing the byte at index [n]\n with [c].\n @raise Invalid_argument if [n] is not a valid index in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 66, "pos_bol": 2901, "pos_cnum": 2901 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 68, "pos_bol": 2986, "pos_cnum": 3052 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 66, "pos_bol": 2901, "pos_cnum": 2901 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 68, "pos_bol": 2986, "pos_cnum": 3052 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 66, "pos_bol": 2901, "pos_cnum": 2901 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 68, "pos_bol": 2986, "pos_cnum": 3052 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 66, "pos_bol": 2901, "pos_cnum": 2901 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 68, "pos_bol": 2986, "pos_cnum": 3052 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2837 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2900 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2837 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 65, "pos_bol": 2837, "pos_cnum": 2900 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3063 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3069 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3072 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3075 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3079 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3072 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_create_bytes" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [create n] returns a new byte sequence of length [n]. The\n sequence is uninitialized and contains arbitrary bytes.\n @raise Invalid_argument if [n < 0] or [n > ]{!Sys.max_string_length}. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 71, "pos_bol": 3107, "pos_cnum": 3107 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 73, "pos_bol": 3229, "pos_cnum": 3305 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 71, "pos_bol": 3107, "pos_cnum": 3107 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 73, "pos_bol": 3229, "pos_cnum": 3305 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 71, "pos_bol": 3107, "pos_cnum": 3107 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 73, "pos_bol": 3229, "pos_cnum": 3305 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 71, "pos_bol": 3107, "pos_cnum": 3107 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 73, "pos_bol": 3229, "pos_cnum": 3305 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3054 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3106 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3054 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 70, "pos_bol": 3054, "pos_cnum": 3106 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3311 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3315 }, "loc_ghost": false }, "txt2": "make" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3318 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3321 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3325 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3329 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3333 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3338 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3325 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3338 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3318 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3338 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [make n c] returns a new byte sequence of length [n], filled with\n the byte [c].\n @raise Invalid_argument if [n < 0] or [n > ]{!Sys.max_string_length}. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 76, "pos_bol": 3339, "pos_cnum": 3339 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 78, "pos_bol": 3427, "pos_cnum": 3503 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 76, "pos_bol": 3339, "pos_cnum": 3339 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 78, "pos_bol": 3427, "pos_cnum": 3503 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 76, "pos_bol": 3339, "pos_cnum": 3339 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 78, "pos_bol": 3427, "pos_cnum": 3503 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 76, "pos_bol": 3339, "pos_cnum": 3339 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 78, "pos_bol": 3427, "pos_cnum": 3503 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3307 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3338 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3307 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 75, "pos_bol": 3307, "pos_cnum": 3338 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3509 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3513 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3516 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3519 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3526 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3529 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3533 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3537 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3526 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3537 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3542 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3547 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3523 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3547 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3516 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3547 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [init n f] returns a fresh byte sequence of length [n],\n with character [i] initialized to the result of [f i] (in increasing\n index order).\n @raise Invalid_argument if [n < 0] or [n > ]{!Sys.max_string_length}. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 81, "pos_bol": 3548, "pos_cnum": 3548 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 84, "pos_bol": 3699, "pos_cnum": 3775 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 81, "pos_bol": 3548, "pos_cnum": 3548 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 84, "pos_bol": 3699, "pos_cnum": 3775 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 81, "pos_bol": 3548, "pos_cnum": 3548 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 84, "pos_bol": 3699, "pos_cnum": 3775 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 81, "pos_bol": 3548, "pos_cnum": 3548 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 84, "pos_bol": 3699, "pos_cnum": 3775 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3505 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3547 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3505 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 80, "pos_bol": 3505, "pos_cnum": 3547 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3781 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3786 }, "loc_ghost": false }, "txt2": "empty" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3789 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3794 }, "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 byte sequence of size 0. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3795 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3828 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3795 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3828 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3795 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3828 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3795 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 87, "pos_bol": 3795, "pos_cnum": 3828 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3777 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3794 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3777 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 86, "pos_bol": 3777, "pos_cnum": 3794 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3834 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3838 }, "loc_ghost": false }, "txt2": "copy" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3841 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3846 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3850 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3855 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3841 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3855 }, "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 new byte sequence that contains the same bytes as the\n argument. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 90, "pos_bol": 3856, "pos_cnum": 3856 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 91, "pos_bol": 3923, "pos_cnum": 3939 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 90, "pos_bol": 3856, "pos_cnum": 3856 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 91, "pos_bol": 3923, "pos_cnum": 3939 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 90, "pos_bol": 3856, "pos_cnum": 3856 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 91, "pos_bol": 3923, "pos_cnum": 3939 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 90, "pos_bol": 3856, "pos_cnum": 3856 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 91, "pos_bol": 3923, "pos_cnum": 3939 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3830 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3855 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3830 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 89, "pos_bol": 3830, "pos_cnum": 3855 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3945 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3954 }, "loc_ghost": false }, "txt2": "of_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3957 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3963 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3967 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3972 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3957 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3972 }, "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 new byte sequence that contains the same bytes as the\n given string. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 94, "pos_bol": 3973, "pos_cnum": 3973 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 95, "pos_bol": 4040, "pos_cnum": 4060 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 94, "pos_bol": 3973, "pos_cnum": 3973 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 95, "pos_bol": 4040, "pos_cnum": 4060 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 94, "pos_bol": 3973, "pos_cnum": 3973 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 95, "pos_bol": 4040, "pos_cnum": 4060 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 94, "pos_bol": 3973, "pos_cnum": 3973 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 95, "pos_bol": 4040, "pos_cnum": 4060 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3941 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3972 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3941 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 93, "pos_bol": 3941, "pos_cnum": 3972 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4066 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4075 }, "loc_ghost": false }, "txt2": "to_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4078 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4087 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4093 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4078 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4093 }, "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 new string that contains the same bytes as the given byte\n sequence. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 98, "pos_bol": 4094, "pos_cnum": 4094 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 99, "pos_bol": 4165, "pos_cnum": 4181 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 98, "pos_bol": 4094, "pos_cnum": 4094 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 99, "pos_bol": 4165, "pos_cnum": 4181 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 98, "pos_bol": 4094, "pos_cnum": 4094 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 99, "pos_bol": 4165, "pos_cnum": 4181 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 98, "pos_bol": 4094, "pos_cnum": 4094 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 99, "pos_bol": 4165, "pos_cnum": 4181 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4062 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4093 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4062 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 97, "pos_bol": 4062, "pos_cnum": 4093 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4187 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4190 }, "loc_ghost": false }, "txt2": "sub" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4193 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4198 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4206 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4209 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4217 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4220 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4224 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4229 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4213 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4229 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4202 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4229 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4193 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4229 }, "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", " [sub s ~pos ~len] returns a new byte sequence of length [len],\n containing the subsequence of [s] that starts at position [pos]\n and has length [len].\n @raise Invalid_argument if [pos] and [len] do not designate a\n valid range of [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 102, "pos_bol": 4230, "pos_cnum": 4230 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 106, "pos_bol": 4457, "pos_cnum": 4483 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 102, "pos_bol": 4230, "pos_cnum": 4230 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 106, "pos_bol": 4457, "pos_cnum": 4483 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 102, "pos_bol": 4230, "pos_cnum": 4230 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 106, "pos_bol": 4457, "pos_cnum": 4483 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 102, "pos_bol": 4230, "pos_cnum": 4230 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 106, "pos_bol": 4457, "pos_cnum": 4483 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4183 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4229 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4183 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 101, "pos_bol": 4183, "pos_cnum": 4229 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4489 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4499 }, "loc_ghost": false }, "txt2": "sub_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4515 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4518 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4526 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4529 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4533 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4539 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4522 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4539 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4511 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4539 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4539 }, "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 {!sub} but return a string instead of a byte sequence. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4540 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4609 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4540 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4609 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4540 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4609 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4540 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 109, "pos_bol": 4540, "pos_cnum": 4609 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4539 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4485 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 108, "pos_bol": 4485, "pos_cnum": 4539 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4615 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4621 }, "loc_ghost": false }, "txt2": "extend" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4624 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "left" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4638 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4641 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "right" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4651 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4654 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4658 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4663 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4645 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4663 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4633 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4663 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4624 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4663 }, "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", " [extend s ~left ~right] returns a new byte sequence that contains\n the bytes of [s], with [left] uninitialized bytes prepended and\n [right] uninitialized bytes appended to it. If [left] or [right]\n is negative, then bytes are removed (instead of appended) from\n the corresponding side of [s].\n @raise Invalid_argument if the result length is negative or\n longer than {!Sys.max_string_length} bytes.\n @since 4.05 in BytesLabels ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 112, "pos_bol": 4664, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 119, "pos_bol": 5085, "pos_cnum": 5118 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 112, "pos_bol": 4664, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 119, "pos_bol": 5085, "pos_cnum": 5118 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 112, "pos_bol": 4664, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 119, "pos_bol": 5085, "pos_cnum": 5118 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 112, "pos_bol": 4664, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 119, "pos_bol": 5085, "pos_cnum": 5118 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4611 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4663 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4611 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 111, "pos_bol": 4611, "pos_cnum": 4663 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5124 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5128 }, "loc_ghost": false }, "txt2": "fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5131 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5136 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5144 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5147 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5155 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5162 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5170 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5162 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5151 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5140 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5131 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "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", " [fill s ~pos ~len c] modifies [s] in place, replacing [len]\n characters with [c], starting at [pos].\n @raise Invalid_argument if [pos] and [len] do not designate a\n valid range of [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 122, "pos_bol": 5175, "pos_cnum": 5175 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 125, "pos_bol": 5349, "pos_cnum": 5375 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 122, "pos_bol": 5175, "pos_cnum": 5175 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 125, "pos_bol": 5349, "pos_cnum": 5375 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 122, "pos_bol": 5175, "pos_cnum": 5175 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 125, "pos_bol": 5349, "pos_cnum": 5375 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 122, "pos_bol": 5175, "pos_cnum": 5175 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 125, "pos_bol": 5349, "pos_cnum": 5375 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5120 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5120 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 121, "pos_bol": 5120, "pos_cnum": 5174 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 127, "pos_bol": 5377, "pos_cnum": 5381 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 127, "pos_bol": 5377, "pos_cnum": 5385 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5394 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5399 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5411 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5414 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5422 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5427 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5439 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5442 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5450 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5459 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5431 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5418 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5403 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 128, "pos_bol": 5388, "pos_cnum": 5390 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [blit ~src ~src_pos ~dst ~dst_pos ~len] copies [len] bytes from byte\n sequence [src], starting at index [src_pos], to byte sequence [dst],\n starting at index [dst_pos]. It works correctly even if [src] and [dst] are\n the same byte sequence, and the source and destination intervals\n overlap.\n @raise Invalid_argument if [src_pos] and [len] do not\n designate a valid range of [src], or if [dst_pos] and [len]\n do not designate a valid range of [dst]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 130, "pos_bol": 5464, "pos_cnum": 5464 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 137, "pos_bol": 5894, "pos_cnum": 5941 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 130, "pos_bol": 5464, "pos_cnum": 5464 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 137, "pos_bol": 5894, "pos_cnum": 5941 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 130, "pos_bol": 5464, "pos_cnum": 5464 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 137, "pos_bol": 5894, "pos_cnum": 5941 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 130, "pos_bol": 5464, "pos_cnum": 5464 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 137, "pos_bol": 5894, "pos_cnum": 5941 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 127, "pos_bol": 5377, "pos_cnum": 5377 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 127, "pos_bol": 5377, "pos_cnum": 5377 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 129, "pos_bol": 5454, "pos_cnum": 5463 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 139, "pos_bol": 5943, "pos_cnum": 5947 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 139, "pos_bol": 5943, "pos_cnum": 5958 }, "loc_ghost": false }, "txt2": "blit_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5967 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5973 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5985 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5996 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6001 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6013 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6016 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6024 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6027 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6033 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6020 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 6005 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5992 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 140, "pos_bol": 5961, "pos_cnum": 5963 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [blit_string ~src ~src_pos ~dst ~dst_pos ~len] copies [len] bytes from\n string [src], starting at index [src_pos], to byte sequence [dst],\n starting at index [dst_pos].\n @raise Invalid_argument if [src_pos] and [len] do not\n designate a valid range of [src], or if [dst_pos] and [len]\n do not designate a valid range of [dst].\n @since 4.05 in BytesLabels ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 142, "pos_bol": 6038, "pos_cnum": 6038 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 148, "pos_bol": 6384, "pos_cnum": 6417 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 142, "pos_bol": 6038, "pos_cnum": 6038 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 148, "pos_bol": 6384, "pos_cnum": 6417 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 142, "pos_bol": 6038, "pos_cnum": 6038 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 148, "pos_bol": 6384, "pos_cnum": 6417 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 142, "pos_bol": 6038, "pos_cnum": 6038 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 148, "pos_bol": 6384, "pos_cnum": 6417 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 139, "pos_bol": 5943, "pos_cnum": 5943 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 139, "pos_bol": 5943, "pos_cnum": 5943 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 141, "pos_bol": 6028, "pos_cnum": 6037 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6423 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6429 }, "loc_ghost": false }, "txt2": "concat" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "sep" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6436 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6441 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6450 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6455 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6459 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6432 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6464 }, "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", " [concat ~sep sl] concatenates the list of byte sequences [sl],\n inserting the separator byte sequence [sep] between each, and\n returns the result as a new byte sequence.\n @raise Invalid_argument if the result is longer than\n {!Sys.max_string_length} bytes.\n ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 151, "pos_bol": 6465, "pos_cnum": 6465 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 156, "pos_bol": 6738, "pos_cnum": 6744 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 151, "pos_bol": 6465, "pos_cnum": 6465 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 156, "pos_bol": 6738, "pos_cnum": 6744 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 151, "pos_bol": 6465, "pos_cnum": 6465 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 156, "pos_bol": 6738, "pos_cnum": 6744 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 151, "pos_bol": 6465, "pos_cnum": 6465 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 156, "pos_bol": 6738, "pos_cnum": 6744 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6419 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6464 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6419 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 150, "pos_bol": 6419, "pos_cnum": 6464 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6750 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6753 }, "loc_ghost": false }, "txt2": "cat" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6756 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6761 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6765 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6770 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6774 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6779 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6765 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6779 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6756 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6779 }, "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", " [cat s1 s2] concatenates [s1] and [s2] and returns the result\n as a new byte sequence.\n @raise Invalid_argument if the result is longer than\n {!Sys.max_string_length} bytes.\n @since 4.05 in BytesLabels ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 159, "pos_bol": 6780, "pos_cnum": 6780 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 163, "pos_bol": 6967, "pos_cnum": 7000 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 159, "pos_bol": 6780, "pos_cnum": 6780 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 163, "pos_bol": 6967, "pos_cnum": 7000 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 159, "pos_bol": 6780, "pos_cnum": 6780 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 163, "pos_bol": 6967, "pos_cnum": 7000 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 159, "pos_bol": 6780, "pos_cnum": 6780 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 163, "pos_bol": 6967, "pos_cnum": 7000 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6746 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6779 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6746 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 158, "pos_bol": 6746, "pos_cnum": 6779 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7006 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7010 }, "loc_ghost": false }, "txt2": "iter" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7016 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7020 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7024 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7028 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7016 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7028 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7033 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7038 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7042 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7033 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7013 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [iter ~f s] applies function [f] in turn to all the bytes of [s].\n It is equivalent to [f (get s 0); f (get s 1); ...; f (get s\n (length s - 1)); ()]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 166, "pos_bol": 7047, "pos_cnum": 7047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 168, "pos_bol": 7182, "pos_cnum": 7210 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 166, "pos_bol": 7047, "pos_cnum": 7047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 168, "pos_bol": 7182, "pos_cnum": 7210 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 166, "pos_bol": 7047, "pos_cnum": 7047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 168, "pos_bol": 7182, "pos_cnum": 7210 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 166, "pos_bol": 7047, "pos_cnum": 7047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 168, "pos_bol": 7182, "pos_cnum": 7210 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7002 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7046 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7002 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 165, "pos_bol": 7002, "pos_cnum": 7046 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7216 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7221 }, "loc_ghost": false }, "txt2": "iteri" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7227 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7230 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7234 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7238 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7242 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7234 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7227 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7251 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7256 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7260 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7264 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7251 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7264 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7224 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7264 }, "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 {!iter}, but the function is applied to the index of\n the byte as first argument and the byte itself as second\n argument. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 171, "pos_bol": 7265, "pos_cnum": 7265 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 173, "pos_bol": 7391, "pos_cnum": 7407 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 171, "pos_bol": 7265, "pos_cnum": 7265 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 173, "pos_bol": 7391, "pos_cnum": 7407 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 171, "pos_bol": 7265, "pos_cnum": 7265 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 173, "pos_bol": 7391, "pos_cnum": 7407 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 171, "pos_bol": 7265, "pos_cnum": 7265 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 173, "pos_bol": 7391, "pos_cnum": 7407 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7212 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7264 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7212 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 170, "pos_bol": 7212, "pos_cnum": 7264 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7413 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7416 }, "loc_ghost": false }, "txt2": "map" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7422 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7426 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7430 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7434 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7422 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7434 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7439 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7444 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7448 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7439 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7419 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [map ~f s] applies function [f] in turn to all the bytes of [s] (in\n increasing index order) and stores the resulting bytes in a new sequence\n that is returned as the result. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 176, "pos_bol": 7454, "pos_cnum": 7454 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 178, "pos_bol": 7603, "pos_cnum": 7641 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 176, "pos_bol": 7454, "pos_cnum": 7454 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 178, "pos_bol": 7603, "pos_cnum": 7641 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 176, "pos_bol": 7454, "pos_cnum": 7454 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 178, "pos_bol": 7603, "pos_cnum": 7641 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 176, "pos_bol": 7454, "pos_cnum": 7454 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 178, "pos_bol": 7603, "pos_cnum": 7641 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7409 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7453 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7409 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 175, "pos_bol": 7409, "pos_cnum": 7453 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7647 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7651 }, "loc_ghost": false }, "txt2": "mapi" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7657 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7660 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7668 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7672 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7676 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7676 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7657 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7676 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7681 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7686 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7690 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7681 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7654 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [mapi ~f s] calls [f] with each character of [s] and its\n index (in increasing index order) and stores the resulting bytes\n in a new sequence that is returned as the result. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 181, "pos_bol": 7696, "pos_cnum": 7696 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 183, "pos_bol": 7826, "pos_cnum": 7882 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 181, "pos_bol": 7696, "pos_cnum": 7696 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 183, "pos_bol": 7826, "pos_cnum": 7882 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 181, "pos_bol": 7696, "pos_cnum": 7696 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 183, "pos_bol": 7826, "pos_cnum": 7882 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 181, "pos_bol": 7696, "pos_cnum": 7696 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 183, "pos_bol": 7826, "pos_cnum": 7882 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7643 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7695 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7643 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 180, "pos_bol": 7643, "pos_cnum": 7695 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7888 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7897 }, "loc_ghost": false }, "txt2": "fold_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7903 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7907 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7911 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7915 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7919 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7911 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7903 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7923 }, "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/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7933 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7937 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7941 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7946 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7950 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7954 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7941 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7954 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7928 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7954 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7900 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7954 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [fold_left f x s] computes\n [f (... (f (f x (get s 0)) (get s 1)) ...) (get s (n-1))],\n where [n] is the length of [s].\n @since 4.13 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 186, "pos_bol": 7955, "pos_cnum": 7955 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 189, "pos_bol": 8085, "pos_cnum": 8103 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 186, "pos_bol": 7955, "pos_cnum": 7955 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 189, "pos_bol": 8085, "pos_cnum": 8103 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 186, "pos_bol": 7955, "pos_cnum": 7955 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 189, "pos_bol": 8085, "pos_cnum": 8103 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 186, "pos_bol": 7955, "pos_cnum": 7955 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 189, "pos_bol": 8085, "pos_cnum": 8103 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7884 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7954 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7884 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 185, "pos_bol": 7884, "pos_cnum": 7954 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8109 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8119 }, "loc_ghost": false }, "txt2": "fold_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8125 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8129 }, "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/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8133 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8137 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8141 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8133 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8125 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8145 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8155 }, "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/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8164 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8168 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "acc" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8172 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8159 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8122 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [fold_right f s x] computes\n [f (get s 0) (f (get s 1) ( ... (f (get s (n-1)) x) ...))],\n where [n] is the length of [s].\n @since 4.13 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 192, "pos_bol": 8177, "pos_cnum": 8177 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 195, "pos_bol": 8309, "pos_cnum": 8327 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 192, "pos_bol": 8177, "pos_cnum": 8177 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 195, "pos_bol": 8309, "pos_cnum": 8327 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 192, "pos_bol": 8177, "pos_cnum": 8177 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 195, "pos_bol": 8309, "pos_cnum": 8327 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 192, "pos_bol": 8177, "pos_cnum": 8177 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 195, "pos_bol": 8309, "pos_cnum": 8327 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8105 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8176 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8105 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 191, "pos_bol": 8105, "pos_cnum": 8176 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8333 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8340 }, "loc_ghost": false }, "txt2": "for_all" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8346 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8354 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8358 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8346 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8358 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8363 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8368 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8372 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8376 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8363 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8376 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8343 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8376 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [for_all p s] checks if all characters in [s] satisfy the predicate [p].\n @since 4.13 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 198, "pos_bol": 8377, "pos_cnum": 8377 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 199, "pos_bol": 8454, "pos_cnum": 8472 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 198, "pos_bol": 8377, "pos_cnum": 8377 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 199, "pos_bol": 8454, "pos_cnum": 8472 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 198, "pos_bol": 8377, "pos_cnum": 8377 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 199, "pos_bol": 8454, "pos_cnum": 8472 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 198, "pos_bol": 8377, "pos_cnum": 8377 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 199, "pos_bol": 8454, "pos_cnum": 8472 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8329 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8376 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8329 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 197, "pos_bol": 8329, "pos_cnum": 8376 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8478 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8484 }, "loc_ghost": false }, "txt2": "exists" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "f" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8490 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8494 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8498 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8502 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8490 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8502 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8507 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8512 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8516 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8507 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8487 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [exists p s] checks if at least one character of [s] satisfies the predicate\n [p].\n @since 4.13 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 202, "pos_bol": 8521, "pos_cnum": 8521 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 204, "pos_bol": 8611, "pos_cnum": 8629 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 202, "pos_bol": 8521, "pos_cnum": 8521 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 204, "pos_bol": 8611, "pos_cnum": 8629 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 202, "pos_bol": 8521, "pos_cnum": 8521 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 204, "pos_bol": 8611, "pos_cnum": 8629 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 202, "pos_bol": 8521, "pos_cnum": 8521 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 204, "pos_bol": 8611, "pos_cnum": 8629 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8474 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8520 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8474 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 201, "pos_bol": 8474, "pos_cnum": 8520 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8635 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8639 }, "loc_ghost": false }, "txt2": "trim" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8642 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8647 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8651 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8656 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8642 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8656 }, "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 argument, without leading and trailing\n whitespace. The bytes regarded as whitespace are the ASCII\n characters [' '], ['\\012'], ['\\n'], ['\\r'], and ['\\t']. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 207, "pos_bol": 8657, "pos_cnum": 8657 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 209, "pos_bol": 8784, "pos_cnum": 8846 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 207, "pos_bol": 8657, "pos_cnum": 8657 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 209, "pos_bol": 8784, "pos_cnum": 8846 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 207, "pos_bol": 8657, "pos_cnum": 8657 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 209, "pos_bol": 8784, "pos_cnum": 8846 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 207, "pos_bol": 8657, "pos_cnum": 8657 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 209, "pos_bol": 8784, "pos_cnum": 8846 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8631 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8656 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8631 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 206, "pos_bol": 8631, "pos_cnum": 8656 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8852 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8859 }, "loc_ghost": false }, "txt2": "escaped" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8862 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8867 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8871 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8876 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8862 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8876 }, "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 argument, with special characters represented\n by escape sequences, following the lexical conventions of OCaml.\n All characters outside the ASCII printable range (32..126) are\n escaped, as well as backslash and double-quote.\n @raise Invalid_argument if the result is longer than\n {!Sys.max_string_length} bytes. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 212, "pos_bol": 8877, "pos_cnum": 8877 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 217, "pos_bol": 9193, "pos_cnum": 9231 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 212, "pos_bol": 8877, "pos_cnum": 8877 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 217, "pos_bol": 9193, "pos_cnum": 9231 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 212, "pos_bol": 8877, "pos_cnum": 8877 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 217, "pos_bol": 9193, "pos_cnum": 9231 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 212, "pos_bol": 8877, "pos_cnum": 8877 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 217, "pos_bol": 9193, "pos_cnum": 9231 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8876 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 211, "pos_bol": 8848, "pos_cnum": 8876 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9237 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9242 }, "loc_ghost": false }, "txt2": "index" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9245 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9250 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9254 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9262 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9254 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9245 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9265 }, "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", " [index s c] returns the index of the first occurrence of byte [c]\n in [s].\n @raise Not_found if [c] does not occur in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 220, "pos_bol": 9266, "pos_cnum": 9266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 222, "pos_bol": 9348, "pos_cnum": 9401 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 220, "pos_bol": 9266, "pos_cnum": 9266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 222, "pos_bol": 9348, "pos_cnum": 9401 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 220, "pos_bol": 9266, "pos_cnum": 9266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 222, "pos_bol": 9348, "pos_cnum": 9401 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 220, "pos_bol": 9266, "pos_cnum": 9266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 222, "pos_bol": 9348, "pos_cnum": 9401 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9233 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9265 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9233 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 219, "pos_bol": 9233, "pos_cnum": 9265 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9407 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9416 }, "loc_ghost": false }, "txt2": "index_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9418 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9427 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9431 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9435 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9438 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9435 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9445 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9427 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9445 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9418 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9445 }, "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", " [index_opt s c] returns the index of the first occurrence of byte [c]\n in [s] or [None] if [c] does not occur in [s].\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 225, "pos_bol": 9446, "pos_cnum": 9446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 227, "pos_bol": 9571, "pos_cnum": 9589 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 225, "pos_bol": 9446, "pos_cnum": 9446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 227, "pos_bol": 9571, "pos_cnum": 9589 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 225, "pos_bol": 9446, "pos_cnum": 9446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 227, "pos_bol": 9571, "pos_cnum": 9589 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 225, "pos_bol": 9446, "pos_cnum": 9446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 227, "pos_bol": 9571, "pos_cnum": 9589 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9403 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9445 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9403 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 224, "pos_bol": 9403, "pos_cnum": 9445 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9595 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9601 }, "loc_ghost": false }, "txt2": "rindex" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9604 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9609 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9613 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9617 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9621 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9624 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9613 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9624 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9604 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9624 }, "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", " [rindex s c] returns the index of the last occurrence of byte [c]\n in [s].\n @raise Not_found if [c] does not occur in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 230, "pos_bol": 9625, "pos_cnum": 9625 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 232, "pos_bol": 9707, "pos_cnum": 9760 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 230, "pos_bol": 9625, "pos_cnum": 9625 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 232, "pos_bol": 9707, "pos_cnum": 9760 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 230, "pos_bol": 9625, "pos_cnum": 9625 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 232, "pos_bol": 9707, "pos_cnum": 9760 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 230, "pos_bol": 9625, "pos_cnum": 9625 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 232, "pos_bol": 9707, "pos_cnum": 9760 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9591 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9624 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9591 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 229, "pos_bol": 9591, "pos_cnum": 9624 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9766 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9776 }, "loc_ghost": false }, "txt2": "rindex_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9778 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9783 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9787 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9791 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9795 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9798 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9795 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9787 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9778 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9805 }, "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", " [rindex_opt s c] returns the index of the last occurrence of byte [c]\n in [s] or [None] if [c] does not occur in [s].\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 235, "pos_bol": 9806, "pos_cnum": 9806 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 237, "pos_bol": 9931, "pos_cnum": 9949 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 235, "pos_bol": 9806, "pos_cnum": 9806 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 237, "pos_bol": 9931, "pos_cnum": 9949 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 235, "pos_bol": 9806, "pos_cnum": 9806 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 237, "pos_bol": 9931, "pos_cnum": 9949 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 235, "pos_bol": 9806, "pos_cnum": 9806 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 237, "pos_bol": 9931, "pos_cnum": 9949 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9762 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9805 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9762 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 234, "pos_bol": 9762, "pos_cnum": 9805 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9955 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9965 }, "loc_ghost": false }, "txt2": "index_from" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9968 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9973 }, "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/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9980 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9984 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9992 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9995 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9984 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9995 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9995 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9968 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9995 }, "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", " [index_from s i c] returns the index of the first occurrence of\n byte [c] in [s] after position [i]. [index s c] is\n equivalent to [index_from s 0 c].\n @raise Invalid_argument if [i] is not a valid position in [s].\n @raise Not_found if [c] does not occur in [s] after position [i]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 240, "pos_bol": 9996, "pos_cnum": 9996 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 244, "pos_bol": 10225, "pos_cnum": 10297 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 240, "pos_bol": 9996, "pos_cnum": 9996 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 244, "pos_bol": 10225, "pos_cnum": 10297 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 240, "pos_bol": 9996, "pos_cnum": 9996 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 244, "pos_bol": 10225, "pos_cnum": 10297 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 240, "pos_bol": 9996, "pos_cnum": 9996 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 244, "pos_bol": 10225, "pos_cnum": 10297 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9951 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9995 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9951 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 239, "pos_bol": 9951, "pos_cnum": 9995 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10303 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10317 }, "loc_ghost": false }, "txt2": "index_from_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10319 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10324 }, "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/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10328 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10335 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10339 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10343 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10346 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10343 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10335 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10328 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10319 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10353 }, "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", " [index_from_opt s i c] returns the index of the first occurrence of\n byte [c] in [s] after position [i] or [None] if [c] does not occur in [s]\n after position [i].\n [index_opt s c] is equivalent to [index_from_opt s 0 c].\n @raise Invalid_argument if [i] is not a valid position in [s].\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 247, "pos_bol": 10354, "pos_cnum": 10354 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 252, "pos_bol": 10656, "pos_cnum": 10674 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 247, "pos_bol": 10354, "pos_cnum": 10354 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 252, "pos_bol": 10656, "pos_cnum": 10674 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 247, "pos_bol": 10354, "pos_cnum": 10354 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 252, "pos_bol": 10656, "pos_cnum": 10674 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 247, "pos_bol": 10354, "pos_cnum": 10354 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 252, "pos_bol": 10656, "pos_cnum": 10674 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10299 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10353 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10299 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 246, "pos_bol": 10299, "pos_cnum": 10353 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10680 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10691 }, "loc_ghost": false }, "txt2": "rindex_from" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10694 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10699 }, "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/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10703 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10714 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10718 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10721 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10721 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10703 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10721 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10694 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "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", " [rindex_from s i c] returns the index of the last occurrence of\n byte [c] in [s] before position [i+1]. [rindex s c] is equivalent\n to [rindex_from s (length s - 1) c].\n @raise Invalid_argument if [i+1] is not a valid position in [s].\n @raise Not_found if [c] does not occur in [s] before position [i+1]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 255, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 259, "pos_bol": 10971, "pos_cnum": 11046 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 255, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 259, "pos_bol": 10971, "pos_cnum": 11046 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 255, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 259, "pos_bol": 10971, "pos_cnum": 11046 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 255, "pos_bol": 10722, "pos_cnum": 10722 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 259, "pos_bol": 10971, "pos_cnum": 11046 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10676 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10721 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10676 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 254, "pos_bol": 10676, "pos_cnum": 10721 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11052 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11067 }, "loc_ghost": false }, "txt2": "rindex_from_opt" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11069 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11074 }, "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/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11078 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11081 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11085 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11089 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "option", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11096 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11093 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11085 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11078 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11069 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11103 }, "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", " [rindex_from_opt s i c] returns the index of the last occurrence\n of byte [c] in [s] before position [i+1] or [None] if [c] does not\n occur in [s] before position [i+1]. [rindex_opt s c] is equivalent to\n [rindex_from s (length s - 1) c].\n @raise Invalid_argument if [i+1] is not a valid position in [s].\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 262, "pos_bol": 11104, "pos_cnum": 11104 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 267, "pos_bol": 11426, "pos_cnum": 11444 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 262, "pos_bol": 11104, "pos_cnum": 11104 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 267, "pos_bol": 11426, "pos_cnum": 11444 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 262, "pos_bol": 11104, "pos_cnum": 11104 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 267, "pos_bol": 11426, "pos_cnum": 11444 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 262, "pos_bol": 11104, "pos_cnum": 11104 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 267, "pos_bol": 11426, "pos_cnum": 11444 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11048 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11103 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11048 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 261, "pos_bol": 11048, "pos_cnum": 11103 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11450 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11458 }, "loc_ghost": false }, "txt2": "contains" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11461 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11466 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11470 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11474 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11478 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11482 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11470 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11482 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11461 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11482 }, "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", " [contains s c] tests if byte [c] appears in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11483 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11538 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11483 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11538 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11483 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11538 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11483 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 270, "pos_bol": 11483, "pos_cnum": 11538 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11482 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11446 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 269, "pos_bol": 11446, "pos_cnum": 11482 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11544 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11557 }, "loc_ghost": false }, "txt2": "contains_from" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11560 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11565 }, "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/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11569 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11576 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11580 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11584 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11588 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11576 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11588 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11569 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11588 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11560 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11588 }, "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", " [contains_from s start c] tests if byte [c] appears in [s] after\n position [start]. [contains s c] is equivalent to [contains_from\n s 0 c].\n @raise Invalid_argument if [start] is not a valid position in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 273, "pos_bol": 11589, "pos_cnum": 11589 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 276, "pos_bol": 11740, "pos_cnum": 11813 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 273, "pos_bol": 11589, "pos_cnum": 11589 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 276, "pos_bol": 11740, "pos_cnum": 11813 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 273, "pos_bol": 11589, "pos_cnum": 11589 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 276, "pos_bol": 11740, "pos_cnum": 11813 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 273, "pos_bol": 11589, "pos_cnum": 11589 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 276, "pos_bol": 11740, "pos_cnum": 11813 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11540 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11588 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11540 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 272, "pos_bol": 11540, "pos_cnum": 11588 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11819 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11833 }, "loc_ghost": false }, "txt2": "rcontains_from" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11836 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11841 }, "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/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11845 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11848 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11852 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11856 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11860 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11852 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11845 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11836 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11864 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [rcontains_from s stop c] tests if byte [c] appears in [s] before\n position [stop+1].\n @raise Invalid_argument if [stop < 0] or [stop+1] is not a valid\n position in [s]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 279, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 282, "pos_bol": 12027, "pos_cnum": 12050 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 279, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 282, "pos_bol": 12027, "pos_cnum": 12050 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 279, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 282, "pos_bol": 12027, "pos_cnum": 12050 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 279, "pos_bol": 11865, "pos_cnum": 11865 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 282, "pos_bol": 12027, "pos_cnum": 12050 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11815 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11864 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11815 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 278, "pos_bol": 11815, "pos_cnum": 11864 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12056 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12071 }, "loc_ghost": false }, "txt2": "uppercase_ascii" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12074 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12079 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12083 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12088 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12074 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12088 }, "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 argument, with all lowercase letters\n translated to uppercase, using the US-ASCII character set.\n @since 4.03 (4.05 in BytesLabels) ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 285, "pos_bol": 12089, "pos_cnum": 12089 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 287, "pos_bol": 12213, "pos_cnum": 12252 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 285, "pos_bol": 12089, "pos_cnum": 12089 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 287, "pos_bol": 12213, "pos_cnum": 12252 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 285, "pos_bol": 12089, "pos_cnum": 12089 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 287, "pos_bol": 12213, "pos_cnum": 12252 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 285, "pos_bol": 12089, "pos_cnum": 12089 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 287, "pos_bol": 12213, "pos_cnum": 12252 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12052 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12088 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12052 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 284, "pos_bol": 12052, "pos_cnum": 12088 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12258 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12273 }, "loc_ghost": false }, "txt2": "lowercase_ascii" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12276 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12281 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12285 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12290 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12276 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12290 }, "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 argument, with all uppercase letters\n translated to lowercase, using the US-ASCII character set.\n @since 4.03 (4.05 in BytesLabels) ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 290, "pos_bol": 12291, "pos_cnum": 12291 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 292, "pos_bol": 12415, "pos_cnum": 12454 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 290, "pos_bol": 12291, "pos_cnum": 12291 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 292, "pos_bol": 12415, "pos_cnum": 12454 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 290, "pos_bol": 12291, "pos_cnum": 12291 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 292, "pos_bol": 12415, "pos_cnum": 12454 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 290, "pos_bol": 12291, "pos_cnum": 12291 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 292, "pos_bol": 12415, "pos_cnum": 12454 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12254 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12290 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12254 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 289, "pos_bol": 12254, "pos_cnum": 12290 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12460 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12476 }, "loc_ghost": false }, "txt2": "capitalize_ascii" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12479 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12484 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12488 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12493 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12479 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12493 }, "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 argument, with the first character set to uppercase,\n using the US-ASCII character set.\n @since 4.03 (4.05 in BytesLabels) ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 295, "pos_bol": 12494, "pos_cnum": 12494 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 297, "pos_bol": 12609, "pos_cnum": 12648 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 295, "pos_bol": 12494, "pos_cnum": 12494 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 297, "pos_bol": 12609, "pos_cnum": 12648 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 295, "pos_bol": 12494, "pos_cnum": 12494 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 297, "pos_bol": 12609, "pos_cnum": 12648 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 295, "pos_bol": 12494, "pos_cnum": 12494 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 297, "pos_bol": 12609, "pos_cnum": 12648 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12456 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12493 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12456 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 294, "pos_bol": 12456, "pos_cnum": 12493 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12654 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12672 }, "loc_ghost": false }, "txt2": "uncapitalize_ascii" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12680 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12684 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12689 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12689 }, "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 argument, with the first character set to lowercase,\n using the US-ASCII character set.\n @since 4.03 (4.05 in BytesLabels) ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 300, "pos_bol": 12690, "pos_cnum": 12690 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12844 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 300, "pos_bol": 12690, "pos_cnum": 12690 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12844 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 300, "pos_bol": 12690, "pos_cnum": 12690 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12844 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 300, "pos_bol": 12690, "pos_cnum": 12690 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 302, "pos_bol": 12805, "pos_cnum": 12844 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12650 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12689 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12650 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 299, "pos_bol": 12650, "pos_cnum": 12689 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12851 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12852 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12855 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12860 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "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", " An alias for the type of byte sequences. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12861 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12908 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12861 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12908 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12861 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12908 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12861 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 305, "pos_bol": 12861, "pos_cnum": 12908 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12846 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12860 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12846 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 304, "pos_bol": 12846, "pos_cnum": 12860 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12914 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12921 }, "loc_ghost": false }, "txt2": "compare" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12923 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12924 }, "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/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12928 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12929 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12933 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12936 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12928 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12936 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12923 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12936 }, "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 comparison function for byte sequences, with the same\n specification as {!Stdlib.compare}. Along with the type [t],\n this function [compare] allows the module [Bytes] to be passed as\n argument to the functors {!Set.Make} and {!Map.Make}. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 308, "pos_bol": 12937, "pos_cnum": 12937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 311, "pos_bol": 13135, "pos_cnum": 13195 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 308, "pos_bol": 12937, "pos_cnum": 12937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 311, "pos_bol": 13135, "pos_cnum": 13195 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 308, "pos_bol": 12937, "pos_cnum": 12937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 311, "pos_bol": 13135, "pos_cnum": 13195 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 308, "pos_bol": 12937, "pos_cnum": 12937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 311, "pos_bol": 13135, "pos_cnum": 13195 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12910 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12936 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12910 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 307, "pos_bol": 12910, "pos_cnum": 12936 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13201 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13206 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13208 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13209 }, "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/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13213 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13214 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13218 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13222 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13213 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13222 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13208 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13222 }, "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 function for byte sequences.\n @since 4.03 (4.05 in BytesLabels) ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 314, "pos_bol": 13223, "pos_cnum": 13223 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 315, "pos_bol": 13269, "pos_cnum": 13309 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 314, "pos_bol": 13223, "pos_cnum": 13223 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 315, "pos_bol": 13269, "pos_cnum": 13309 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 314, "pos_bol": 13223, "pos_cnum": 13223 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 315, "pos_bol": 13269, "pos_cnum": 13309 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 314, "pos_bol": 13223, "pos_cnum": 13223 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 315, "pos_bol": 13269, "pos_cnum": 13309 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13197 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13222 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13197 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 313, "pos_bol": 13197, "pos_cnum": 13222 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 317, "pos_bol": 13311, "pos_cnum": 13315 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 317, "pos_bol": 13311, "pos_cnum": 13326 }, "loc_ghost": false }, "txt2": "starts_with" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "prefix" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13384 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13389 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13393 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13398 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13402 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13406 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13393 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13406 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13331 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13406 }, "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", " [starts_with ][~prefix s] is [true] if and only if [s] starts with\n [prefix].\n\n @since 4.13 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 319, "pos_bol": 13407, "pos_cnum": 13407 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 322, "pos_bol": 13493, "pos_cnum": 13511 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 319, "pos_bol": 13407, "pos_cnum": 13407 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 322, "pos_bol": 13493, "pos_cnum": 13511 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 319, "pos_bol": 13407, "pos_cnum": 13407 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 322, "pos_bol": 13493, "pos_cnum": 13511 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 319, "pos_bol": 13407, "pos_cnum": 13407 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 322, "pos_bol": 13493, "pos_cnum": 13511 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 317, "pos_bol": 13311, "pos_cnum": 13311 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13406 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 317, "pos_bol": 13311, "pos_cnum": 13311 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 318, "pos_bol": 13329, "pos_cnum": 13406 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 324, "pos_bol": 13513, "pos_cnum": 13517 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 324, "pos_bol": 13513, "pos_cnum": 13526 }, "loc_ghost": false }, "txt2": "ends_with" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "suffix" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13584 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13589 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13593 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13598 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13602 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13606 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13593 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13606 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13531 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13606 }, "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", " [ends_with ][~suffix s] is [true] if and only if [s] ends with [suffix].\n\n @since 4.13 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 326, "pos_bol": 13607, "pos_cnum": 13607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 328, "pos_bol": 13685, "pos_cnum": 13703 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 326, "pos_bol": 13607, "pos_cnum": 13607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 328, "pos_bol": 13685, "pos_cnum": 13703 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 326, "pos_bol": 13607, "pos_cnum": 13607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 328, "pos_bol": 13685, "pos_cnum": 13703 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 326, "pos_bol": 13607, "pos_cnum": 13607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 328, "pos_bol": 13685, "pos_cnum": 13703 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 324, "pos_bol": 13513, "pos_cnum": 13513 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13606 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 324, "pos_bol": 13513, "pos_cnum": 13513 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 325, "pos_bol": 13529, "pos_cnum": 13606 }, "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:unsafe Unsafe conversions (for advanced users)}\n\n This section describes unsafe, low-level conversion functions\n between [bytes] and [string]. They do not copy the internal data;\n used improperly, they can break the immutability invariant on\n strings provided by the [-safe-string] option. They are available for\n expert library authors, but for most purposes you should use the\n always-correct {!to_string} and {!of_string} instead.\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 330, "pos_bol": 13705, "pos_cnum": 13705 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 338, "pos_bol": 14164, "pos_cnum": 14166 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 330, "pos_bol": 13705, "pos_cnum": 13705 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 338, "pos_bol": 14164, "pos_cnum": 14166 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 330, "pos_bol": 13705, "pos_cnum": 13705 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 338, "pos_bol": 14164, "pos_cnum": 14166 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 330, "pos_bol": 13705, "pos_cnum": 13705 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 338, "pos_bol": 14164, "pos_cnum": 14166 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 330, "pos_bol": 13705, "pos_cnum": 13705 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 338, "pos_bol": 14164, "pos_cnum": 14166 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14172 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14188 }, "loc_ghost": false }, "txt2": "unsafe_to_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14191 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14196 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14200 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14191 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14206 }, "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", " Unsafely convert a byte sequence into a string.\n\n To reason about the use of [unsafe_to_string], it is convenient to\n consider an \"ownership\" discipline. A piece of code that\n manipulates some data \"owns\" it; there are several disjoint ownership\n modes, including:\n - Unique ownership: the data may be accessed and mutated\n - Shared ownership: the data has several owners, that may only\n access it, not mutate it.\n\n Unique ownership is linear: passing the data to another piece of\n code means giving up ownership (we cannot write the\n data again). A unique owner may decide to make the data shared\n (giving up mutation rights on it), but shared data may not become\n uniquely-owned again.\n\n [unsafe_to_string s] can only be used when the caller owns the byte\n sequence [s] -- either uniquely or as shared immutable data. The\n caller gives up ownership of [s], and gains ownership of the\n returned string.\n\n There are two valid use-cases that respect this ownership\n discipline:\n\n 1. Creating a string by initializing and mutating a byte sequence\n that is never changed after initialization is performed.\n\n {[\nlet string_init len f : string =\n let s = Bytes.create len in\n for i = 0 to len - 1 do Bytes.set s i (f i) done;\n Bytes.unsafe_to_string s\n ]}\n\n This function is safe because the byte sequence [s] will never be\n accessed or mutated after [unsafe_to_string] is called. The\n [string_init] code gives up ownership of [s], and returns the\n ownership of the resulting string to its caller.\n\n Note that it would be unsafe if [s] was passed as an additional\n parameter to the function [f] as it could escape this way and be\n mutated in the future -- [string_init] would give up ownership of\n [s] to pass it to [f], and could not call [unsafe_to_string]\n safely.\n\n We have provided the {!String.init}, {!String.map} and\n {!String.mapi} functions to cover most cases of building\n new strings. You should prefer those over [to_string] or\n [unsafe_to_string] whenever applicable.\n\n 2. Temporarily giving ownership of a byte sequence to a function\n that expects a uniquely owned string and returns ownership back, so\n that we can mutate the sequence again after the call ended.\n\n {[\nlet bytes_length (s : bytes) =\n String.length (Bytes.unsafe_to_string s)\n ]}\n\n In this use-case, we do not promise that [s] will never be mutated\n after the call to [bytes_length s]. The {!String.length} function\n temporarily borrows unique ownership of the byte sequence\n (and sees it as a [string]), but returns this ownership back to\n the caller, which may assume that [s] is still a valid byte\n sequence after the call. Note that this is only correct because we\n know that {!String.length} does not capture its argument -- it could\n escape by a side-channel such as a memoization combinator.\n\n The caller may not mutate [s] while the string is borrowed (it has\n temporarily given up ownership). This affects concurrent programs,\n but also higher-order functions: if {!String.length} returned\n a closure to be called later, [s] should not be mutated until this\n closure is fully applied and returns ownership.\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 341, "pos_bol": 14207, "pos_cnum": 14207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 414, "pos_bol": 17427, "pos_cnum": 17429 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 341, "pos_bol": 14207, "pos_cnum": 14207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 414, "pos_bol": 17427, "pos_cnum": 17429 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 341, "pos_bol": 14207, "pos_cnum": 14207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 414, "pos_bol": 17427, "pos_cnum": 17429 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 341, "pos_bol": 14207, "pos_cnum": 14207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 414, "pos_bol": 17427, "pos_cnum": 17429 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14168 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14206 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14168 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 340, "pos_bol": 14168, "pos_cnum": 14206 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17435 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17451 }, "loc_ghost": false }, "txt2": "unsafe_of_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17454 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17460 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17464 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17469 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17454 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17469 }, "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", " Unsafely convert a shared string to a byte sequence that should\n not be mutated.\n\n The same ownership discipline that makes [unsafe_to_string]\n correct applies to [unsafe_of_string]: you may use it if you were\n the owner of the [string] value, and you will own the return\n [bytes] in the same mode.\n\n In practice, unique ownership of string values is extremely\n difficult to reason about correctly. You should always assume\n strings are shared, never uniquely owned.\n\n For example, string literals are implicitly shared by the\n compiler, so you never uniquely own them.\n\n {[\nlet incorrect = Bytes.unsafe_of_string \"hello\"\nlet s = Bytes.of_string \"hello\"\n ]}\n\n The first declaration is incorrect, because the string literal\n [\"hello\"] could be shared by the compiler with other parts of the\n program, and mutating [incorrect] is a bug. You must always use\n the second version, which performs a copy and is thus correct.\n\n Assuming unique ownership of strings that are not string\n literals, but are (partly) built from string literals, is also\n incorrect. For example, mutating [unsafe_of_string (\"foo\" ^ s)]\n could mutate the shared string [\"foo\"] -- assuming a rope-like\n representation of strings. More generally, functions operating on\n strings will assume shared ownership, they do not preserve unique\n ownership. It is thus incorrect to assume unique ownership of the\n result of [unsafe_of_string].\n\n The only case we have reasonable confidence is safe is if the\n produced [bytes] is shared -- used as an immutable byte\n sequence. This is possibly useful for incremental migration of\n low-level programs that manipulate immutable sequences of bytes\n (for example {!Marshal.from_bytes}) and previously used the\n [string] type for this purpose.\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 417, "pos_bol": 17470, "pos_cnum": 17470 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 457, "pos_bol": 19311, "pos_cnum": 19313 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 417, "pos_bol": 17470, "pos_cnum": 17470 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 457, "pos_bol": 19311, "pos_cnum": 19313 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 417, "pos_bol": 17470, "pos_cnum": 17470 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 457, "pos_bol": 19311, "pos_cnum": 19313 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 417, "pos_bol": 17470, "pos_cnum": 17470 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 457, "pos_bol": 19311, "pos_cnum": 19313 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17431 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17469 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17431 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 416, "pos_bol": 17431, "pos_cnum": 17469 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19320 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19333 }, "loc_ghost": false }, "txt2": "split_on_char" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "sep" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19339 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19347 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "list", [ { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19356 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19361 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19356 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19347 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19335 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [split_on_char sep s] returns the list of all (possibly empty)\n subsequences of [s] that are delimited by the [sep] character.\n If [s] is empty, the result is the singleton list [[empty]].\n\n The function's output is specified by the following invariants:\n\n - The list is not empty.\n - Concatenating its elements using [sep] as a separator returns a\n byte sequence equal to the input ([Bytes.concat (Bytes.make 1 sep)\n (Bytes.split_on_char sep s) = s]).\n - No byte sequence in the result contains the [sep] character.\n\n @since 4.13\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 461, "pos_bol": 19367, "pos_cnum": 19367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 474, "pos_bol": 19933, "pos_cnum": 19935 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 461, "pos_bol": 19367, "pos_cnum": 19367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 474, "pos_bol": 19933, "pos_cnum": 19935 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 461, "pos_bol": 19367, "pos_cnum": 19367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 474, "pos_bol": 19933, "pos_cnum": 19935 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 461, "pos_bol": 19367, "pos_cnum": 19367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 474, "pos_bol": 19933, "pos_cnum": 19935 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19316 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19366 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19316 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 460, "pos_bol": 19316, "pos_cnum": 19366 }, "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 Iterators} ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19957 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19957 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19957 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19957 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19937 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 476, "pos_bol": 19937, "pos_cnum": 19957 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19963 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19969 }, "loc_ghost": false }, "txt2": "to_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19972 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19973 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19981 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19987 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19972 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19987 }, "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 string, in increasing index order. Modifications of the\n string during iteration will be reflected in the sequence.\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 479, "pos_bol": 19988, "pos_cnum": 19988 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 481, "pos_bol": 20126, "pos_cnum": 20144 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 479, "pos_bol": 19988, "pos_cnum": 19988 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 481, "pos_bol": 20126, "pos_cnum": 20144 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 479, "pos_bol": 19988, "pos_cnum": 19988 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 481, "pos_bol": 20126, "pos_cnum": 20144 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 479, "pos_bol": 19988, "pos_cnum": 19988 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 481, "pos_bol": 20126, "pos_cnum": 20144 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19959 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19987 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19959 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 478, "pos_bol": 19959, "pos_cnum": 19987 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20157 }, "loc_ghost": false }, "txt2": "to_seqi" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20160 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20161 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_tuple", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20166 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20172 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20166 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20165 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20183 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20160 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20183 }, "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 string, in increasing order, yielding indices along chars\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 484, "pos_bol": 20184, "pos_cnum": 20184 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 485, "pos_bol": 20261, "pos_cnum": 20279 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 484, "pos_bol": 20184, "pos_cnum": 20184 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 485, "pos_bol": 20261, "pos_cnum": 20279 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 484, "pos_bol": 20184, "pos_cnum": 20184 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 485, "pos_bol": 20261, "pos_cnum": 20279 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 484, "pos_bol": 20184, "pos_cnum": 20184 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 485, "pos_bol": 20261, "pos_cnum": 20279 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20146 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20183 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20146 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 483, "pos_bol": 20146, "pos_cnum": 20183 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20285 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20291 }, "loc_ghost": false }, "txt2": "of_seq" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Seqt", [ { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20294 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20298 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20294 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20304 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20308 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20309 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20294 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20309 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Create a string from the generator\n @since 4.07 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 488, "pos_bol": 20310, "pos_cnum": 20310 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 489, "pos_bol": 20349, "pos_cnum": 20367 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 488, "pos_bol": 20310, "pos_cnum": 20310 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 489, "pos_bol": 20349, "pos_cnum": 20367 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 488, "pos_bol": 20310, "pos_cnum": 20310 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 489, "pos_bol": 20349, "pos_cnum": 20367 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 488, "pos_bol": 20310, "pos_cnum": 20310 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 489, "pos_bol": 20349, "pos_cnum": 20367 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20281 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20309 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20281 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 487, "pos_bol": 20281, "pos_cnum": 20309 }, "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:utf UTF codecs and validations}\n\n @since 4.14 ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 491, "pos_bol": 20369, "pos_cnum": 20369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 493, "pos_bol": 20409, "pos_cnum": 20427 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 491, "pos_bol": 20369, "pos_cnum": 20369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 493, "pos_bol": 20409, "pos_cnum": 20427 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 491, "pos_bol": 20369, "pos_cnum": 20369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 493, "pos_bol": 20409, "pos_cnum": 20427 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 491, "pos_bol": 20369, "pos_cnum": 20369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 493, "pos_bol": 20409, "pos_cnum": 20427 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 491, "pos_bol": 20369, "pos_cnum": 20369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 493, "pos_bol": 20409, "pos_cnum": 20427 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {2:utf_8 UTF-8} ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20429 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20451 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20429 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20451 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20429 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20451 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20429 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20451 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20429 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 495, "pos_bol": 20429, "pos_cnum": 20451 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20457 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20472 }, "loc_ghost": false }, "txt2": "get_utf_8_uchar" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20475 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20476 }, "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/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20480 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20483 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Ucharutf_decode", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20487 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20503 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20480 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20503 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20475 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20503 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_utf_8_uchar b i] decodes an UTF-8 character at index [i] in\n [b]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 498, "pos_bol": 20504, "pos_cnum": 20504 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 499, "pos_bol": 20573, "pos_cnum": 20584 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 498, "pos_bol": 20504, "pos_cnum": 20504 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 499, "pos_bol": 20573, "pos_cnum": 20584 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 498, "pos_bol": 20504, "pos_cnum": 20504 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 499, "pos_bol": 20573, "pos_cnum": 20584 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 498, "pos_bol": 20504, "pos_cnum": 20504 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 499, "pos_bol": 20573, "pos_cnum": 20584 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20453 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20503 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20453 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 497, "pos_bol": 20453, "pos_cnum": 20503 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20590 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20605 }, "loc_ghost": false }, "txt2": "set_utf_8_uchar" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20608 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20609 }, "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/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20613 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20616 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Uchart", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20620 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20627 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20631 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20620 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20613 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20608 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_utf_8_uchar b i u] UTF-8 encodes [u] at index [i] in [b]\n and returns the number of bytes [n] that were written starting\n at [i]. If [n] is [0] there was not enough space to encode [u]\n at [i] and [b] was left untouched. Otherwise a new character can\n be encoded at [i + n]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 502, "pos_bol": 20635, "pos_cnum": 20635 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 506, "pos_bol": 20904, "pos_cnum": 20933 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 502, "pos_bol": 20635, "pos_cnum": 20635 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 506, "pos_bol": 20904, "pos_cnum": 20933 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 502, "pos_bol": 20635, "pos_cnum": 20635 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 506, "pos_bol": 20904, "pos_cnum": 20933 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 502, "pos_bol": 20635, "pos_cnum": 20635 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 506, "pos_bol": 20904, "pos_cnum": 20933 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20586 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20634 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20586 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 501, "pos_bol": 20586, "pos_cnum": 20634 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20939 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20953 }, "loc_ghost": false }, "txt2": "is_valid_utf_8" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20956 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20957 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20961 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20965 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20956 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20965 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [is_valid_utf_8 b] is [true] if and only if [b] contains valid\n UTF-8 data. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 509, "pos_bol": 20966, "pos_cnum": 20966 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 510, "pos_bol": 21033, "pos_cnum": 21051 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 509, "pos_bol": 20966, "pos_cnum": 20966 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 510, "pos_bol": 21033, "pos_cnum": 21051 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 509, "pos_bol": 20966, "pos_cnum": 20966 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 510, "pos_bol": 21033, "pos_cnum": 21051 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 509, "pos_bol": 20966, "pos_cnum": 20966 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 510, "pos_bol": 21033, "pos_cnum": 21051 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20935 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20965 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20935 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 508, "pos_bol": 20935, "pos_cnum": 20965 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {2:utf_16be UTF-16BE} ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21053 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21081 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21053 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21081 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21053 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21081 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21053 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21081 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21053 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 512, "pos_bol": 21053, "pos_cnum": 21081 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21087 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21105 }, "loc_ghost": false }, "txt2": "get_utf_16be_uchar" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21108 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21109 }, "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/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21113 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21116 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Ucharutf_decode", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21120 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21136 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21113 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21136 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21108 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21136 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_utf_16be_uchar b i] decodes an UTF-16BE character at index\n [i] in [b]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 515, "pos_bol": 21137, "pos_cnum": 21137 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 516, "pos_bol": 21205, "pos_cnum": 21223 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 515, "pos_bol": 21137, "pos_cnum": 21137 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 516, "pos_bol": 21205, "pos_cnum": 21223 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 515, "pos_bol": 21137, "pos_cnum": 21137 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 516, "pos_bol": 21205, "pos_cnum": 21223 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 515, "pos_bol": 21137, "pos_cnum": 21137 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 516, "pos_bol": 21205, "pos_cnum": 21223 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21083 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21136 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21083 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 514, "pos_bol": 21083, "pos_cnum": 21136 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21229 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21247 }, "loc_ghost": false }, "txt2": "set_utf_16be_uchar" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21250 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21251 }, "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/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21255 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21258 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Uchart", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21262 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21269 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21273 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21262 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21255 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21250 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_utf_16be_uchar b i u] UTF-16BE encodes [u] at index [i] in [b]\n and returns the number of bytes [n] that were written starting\n at [i]. If [n] is [0] there was not enough space to encode [u]\n at [i] and [b] was left untouched. Otherwise a new character can\n be encoded at [i + n]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 519, "pos_bol": 21277, "pos_cnum": 21277 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 523, "pos_bol": 21552, "pos_cnum": 21581 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 519, "pos_bol": 21277, "pos_cnum": 21277 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 523, "pos_bol": 21552, "pos_cnum": 21581 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 519, "pos_bol": 21277, "pos_cnum": 21277 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 523, "pos_bol": 21552, "pos_cnum": 21581 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 519, "pos_bol": 21277, "pos_cnum": 21277 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 523, "pos_bol": 21552, "pos_cnum": 21581 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21225 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21276 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21225 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 518, "pos_bol": 21225, "pos_cnum": 21276 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21587 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21604 }, "loc_ghost": false }, "txt2": "is_valid_utf_16be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21608 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21612 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21616 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21616 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [is_valid_utf_16be b] is [true] if and only if [b] contains valid\n UTF-16BE data. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 526, "pos_bol": 21617, "pos_cnum": 21617 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 527, "pos_bol": 21687, "pos_cnum": 21708 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 526, "pos_bol": 21617, "pos_cnum": 21617 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 527, "pos_bol": 21687, "pos_cnum": 21708 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 526, "pos_bol": 21617, "pos_cnum": 21617 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 527, "pos_bol": 21687, "pos_cnum": 21708 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 526, "pos_bol": 21617, "pos_cnum": 21617 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 527, "pos_bol": 21687, "pos_cnum": 21708 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21583 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21616 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21583 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 525, "pos_bol": 21583, "pos_cnum": 21616 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {2:utf_16le UTF-16LE} ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21738 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21738 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21738 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21738 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21710 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 529, "pos_bol": 21710, "pos_cnum": 21738 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21744 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21762 }, "loc_ghost": false }, "txt2": "get_utf_16le_uchar" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21765 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21766 }, "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/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21770 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21773 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Ucharutf_decode", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21777 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21793 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21770 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21793 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21765 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21793 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_utf_16le_uchar b i] decodes an UTF-16LE character at index\n [i] in [b]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 532, "pos_bol": 21794, "pos_cnum": 21794 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 533, "pos_bol": 21862, "pos_cnum": 21880 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 532, "pos_bol": 21794, "pos_cnum": 21794 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 533, "pos_bol": 21862, "pos_cnum": 21880 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 532, "pos_bol": 21794, "pos_cnum": 21794 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 533, "pos_bol": 21862, "pos_cnum": 21880 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 532, "pos_bol": 21794, "pos_cnum": 21794 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 533, "pos_bol": 21862, "pos_cnum": 21880 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21740 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21793 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21740 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 531, "pos_bol": 21740, "pos_cnum": 21793 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21886 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21904 }, "loc_ghost": false }, "txt2": "set_utf_16le_uchar" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21907 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21908 }, "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/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21912 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21915 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Uchart", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21919 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21926 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21930 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21919 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21912 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21907 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_utf_16le_uchar b i u] UTF-16LE encodes [u] at index [i] in [b]\n and returns the number of bytes [n] that were written starting\n at [i]. If [n] is [0] there was not enough space to encode [u]\n at [i] and [b] was left untouched. Otherwise a new character can\n be encoded at [i + n]. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 536, "pos_bol": 21934, "pos_cnum": 21934 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 540, "pos_bol": 22209, "pos_cnum": 22238 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 536, "pos_bol": 21934, "pos_cnum": 21934 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 540, "pos_bol": 22209, "pos_cnum": 22238 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 536, "pos_bol": 21934, "pos_cnum": 21934 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 540, "pos_bol": 22209, "pos_cnum": 22238 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 536, "pos_bol": 21934, "pos_cnum": 21934 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 540, "pos_bol": 22209, "pos_cnum": 22238 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21882 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21933 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21882 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 535, "pos_bol": 21882, "pos_cnum": 21933 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22244 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22261 }, "loc_ghost": false }, "txt2": "is_valid_utf_16le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22264 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22269 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22273 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22264 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22273 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [is_valid_utf_16le b] is [true] if and only if [b] contains valid\n UTF-16LE data. ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 543, "pos_bol": 22274, "pos_cnum": 22274 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 544, "pos_bol": 22344, "pos_cnum": 22365 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 543, "pos_bol": 22274, "pos_cnum": 22274 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 544, "pos_bol": 22344, "pos_cnum": 22365 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 543, "pos_bol": 22274, "pos_cnum": 22274 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 544, "pos_bol": 22344, "pos_cnum": 22365 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 543, "pos_bol": 22274, "pos_cnum": 22274 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 544, "pos_bol": 22344, "pos_cnum": 22365 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22240 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22273 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22240 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 542, "pos_bol": 22240, "pos_cnum": 22273 }, "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 Binary encoding/decoding of integers} ", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22414 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22414 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22414 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22414 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22367 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 546, "pos_bol": 22367, "pos_cnum": 22414 }, "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 functions in this section binary encode and decode integers to\n and from byte sequences.\n\n All following functions raise [Invalid_argument] if the space\n needed at index [i] to decode or encode the integer is not\n available.\n\n Little-endian (resp. big-endian) encoding means that least\n (resp. most) significant bytes are stored first. Big-endian is\n also known as network byte order. Native-endian encoding is\n either little-endian or big-endian depending on {!Sys.big_endian}.\n\n 32-bit and 64-bit integers are represented by the [int32] and\n [int64] types, which can be interpreted either as signed or\n unsigned numbers.\n\n 8-bit and 16-bit integers are represented by the [int] type,\n which has more bits than the binary encoding. These extra bits\n are handled as follows:\n {ul\n {- Functions that decode signed (resp. unsigned) 8-bit or 16-bit\n integers represented by [int] values sign-extend\n (resp. zero-extend) their result.}\n {- Functions that encode 8-bit or 16-bit integers represented by\n [int] values truncate their input to their least significant\n bytes.}}\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 548, "pos_bol": 22416, "pos_cnum": 22416 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 574, "pos_bol": 23572, "pos_cnum": 23574 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 548, "pos_bol": 22416, "pos_cnum": 22416 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 574, "pos_bol": 23572, "pos_cnum": 23574 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 548, "pos_bol": 22416, "pos_cnum": 22416 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 574, "pos_bol": 23572, "pos_cnum": 23574 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 548, "pos_bol": 22416, "pos_cnum": 22416 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 574, "pos_bol": 23572, "pos_cnum": 23574 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 548, "pos_bol": 22416, "pos_cnum": 22416 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 574, "pos_bol": 23572, "pos_cnum": 23574 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23580 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23589 }, "loc_ghost": false }, "txt2": "get_uint8" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23592 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23597 }, "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/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23601 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23604 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23608 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23611 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23601 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23611 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23592 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23611 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_uint8 b i] is [b]'s unsigned 8-bit integer starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 577, "pos_bol": 23612, "pos_cnum": 23612 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 579, "pos_bol": 23708, "pos_cnum": 23710 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 577, "pos_bol": 23612, "pos_cnum": 23612 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 579, "pos_bol": 23708, "pos_cnum": 23710 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 577, "pos_bol": 23612, "pos_cnum": 23612 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 579, "pos_bol": 23708, "pos_cnum": 23710 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 577, "pos_bol": 23612, "pos_cnum": 23612 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 579, "pos_bol": 23708, "pos_cnum": 23710 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23576 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23611 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23576 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 576, "pos_bol": 23576, "pos_cnum": 23611 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23716 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23724 }, "loc_ghost": false }, "txt2": "get_int8" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23727 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23732 }, "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/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23736 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23739 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23743 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23736 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23727 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int8 b i] is [b]'s signed 8-bit integer starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 582, "pos_bol": 23747, "pos_cnum": 23747 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 584, "pos_bol": 23840, "pos_cnum": 23842 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 582, "pos_bol": 23747, "pos_cnum": 23747 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 584, "pos_bol": 23840, "pos_cnum": 23842 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 582, "pos_bol": 23747, "pos_cnum": 23747 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 584, "pos_bol": 23840, "pos_cnum": 23842 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 582, "pos_bol": 23747, "pos_cnum": 23747 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 584, "pos_bol": 23840, "pos_cnum": 23842 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23712 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23746 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23712 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 581, "pos_bol": 23712, "pos_cnum": 23746 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23861 }, "loc_ghost": false }, "txt2": "get_uint16_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23864 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23869 }, "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/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23873 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23876 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23880 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23883 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23873 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23883 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23864 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23883 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_uint16_ne b i] is [b]'s native-endian unsigned 16-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 587, "pos_bol": 23884, "pos_cnum": 23884 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 590, "pos_bol": 24003, "pos_cnum": 24005 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 587, "pos_bol": 23884, "pos_cnum": 23884 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 590, "pos_bol": 24003, "pos_cnum": 24005 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 587, "pos_bol": 23884, "pos_cnum": 23884 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 590, "pos_bol": 24003, "pos_cnum": 24005 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 587, "pos_bol": 23884, "pos_cnum": 23884 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 590, "pos_bol": 24003, "pos_cnum": 24005 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23844 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23883 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23844 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 586, "pos_bol": 23844, "pos_cnum": 23883 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24011 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24024 }, "loc_ghost": false }, "txt2": "get_uint16_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24027 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24032 }, "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/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24036 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24039 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24043 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24036 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24027 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_uint16_be b i] is [b]'s big-endian unsigned 16-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 593, "pos_bol": 24047, "pos_cnum": 24047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 596, "pos_bol": 24163, "pos_cnum": 24165 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 593, "pos_bol": 24047, "pos_cnum": 24047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 596, "pos_bol": 24163, "pos_cnum": 24165 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 593, "pos_bol": 24047, "pos_cnum": 24047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 596, "pos_bol": 24163, "pos_cnum": 24165 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 593, "pos_bol": 24047, "pos_cnum": 24047 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 596, "pos_bol": 24163, "pos_cnum": 24165 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24007 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24046 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24007 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 592, "pos_bol": 24007, "pos_cnum": 24046 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24171 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24184 }, "loc_ghost": false }, "txt2": "get_uint16_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24187 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24192 }, "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/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24196 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24199 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24203 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24196 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24187 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24206 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_uint16_le b i] is [b]'s little-endian unsigned 16-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 599, "pos_bol": 24207, "pos_cnum": 24207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 602, "pos_bol": 24326, "pos_cnum": 24328 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 599, "pos_bol": 24207, "pos_cnum": 24207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 602, "pos_bol": 24326, "pos_cnum": 24328 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 599, "pos_bol": 24207, "pos_cnum": 24207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 602, "pos_bol": 24326, "pos_cnum": 24328 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 599, "pos_bol": 24207, "pos_cnum": 24207 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 602, "pos_bol": 24326, "pos_cnum": 24328 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24167 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24206 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24167 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 598, "pos_bol": 24167, "pos_cnum": 24206 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24334 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24346 }, "loc_ghost": false }, "txt2": "get_int16_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24349 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24354 }, "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/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24358 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24361 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24365 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24368 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24358 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24368 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24349 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24368 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int16_ne b i] is [b]'s native-endian signed 16-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 605, "pos_bol": 24369, "pos_cnum": 24369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 608, "pos_bol": 24485, "pos_cnum": 24487 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 605, "pos_bol": 24369, "pos_cnum": 24369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 608, "pos_bol": 24485, "pos_cnum": 24487 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 605, "pos_bol": 24369, "pos_cnum": 24369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 608, "pos_bol": 24485, "pos_cnum": 24487 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 605, "pos_bol": 24369, "pos_cnum": 24369 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 608, "pos_bol": 24485, "pos_cnum": 24487 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24330 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24368 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24330 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 604, "pos_bol": 24330, "pos_cnum": 24368 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24493 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24505 }, "loc_ghost": false }, "txt2": "get_int16_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24508 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24513 }, "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/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24517 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24524 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24527 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24517 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24527 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24508 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24527 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int16_be b i] is [b]'s big-endian signed 16-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 611, "pos_bol": 24528, "pos_cnum": 24528 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 614, "pos_bol": 24641, "pos_cnum": 24643 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 611, "pos_bol": 24528, "pos_cnum": 24528 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 614, "pos_bol": 24641, "pos_cnum": 24643 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 611, "pos_bol": 24528, "pos_cnum": 24528 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 614, "pos_bol": 24641, "pos_cnum": 24643 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 611, "pos_bol": 24528, "pos_cnum": 24528 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 614, "pos_bol": 24641, "pos_cnum": 24643 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24489 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24527 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24489 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 610, "pos_bol": 24489, "pos_cnum": 24527 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24649 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24661 }, "loc_ghost": false }, "txt2": "get_int16_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24669 }, "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/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24673 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24676 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24680 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24683 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24673 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24683 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24664 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24683 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int16_le b i] is [b]'s little-endian signed 16-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 617, "pos_bol": 24684, "pos_cnum": 24684 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 620, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 617, "pos_bol": 24684, "pos_cnum": 24684 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 620, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 617, "pos_bol": 24684, "pos_cnum": 24684 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 620, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 617, "pos_bol": 24684, "pos_cnum": 24684 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 620, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24645 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24683 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24645 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 616, "pos_bol": 24645, "pos_cnum": 24683 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24808 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24820 }, "loc_ghost": false }, "txt2": "get_int32_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24823 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24828 }, "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/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24832 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24835 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24839 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24832 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24823 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int32_ne b i] is [b]'s native-endian 32-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 623, "pos_bol": 24845, "pos_cnum": 24845 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 626, "pos_bol": 24954, "pos_cnum": 24956 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 623, "pos_bol": 24845, "pos_cnum": 24845 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 626, "pos_bol": 24954, "pos_cnum": 24956 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 623, "pos_bol": 24845, "pos_cnum": 24845 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 626, "pos_bol": 24954, "pos_cnum": 24956 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 623, "pos_bol": 24845, "pos_cnum": 24845 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 626, "pos_bol": 24954, "pos_cnum": 24956 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24804 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24844 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24804 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 622, "pos_bol": 24804, "pos_cnum": 24844 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24962 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24974 }, "loc_ghost": false }, "txt2": "get_int32_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24982 }, "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/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24986 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24989 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24993 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24998 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24986 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24998 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24977 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24998 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int32_be b i] is [b]'s big-endian 32-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 629, "pos_bol": 24999, "pos_cnum": 24999 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 632, "pos_bol": 25105, "pos_cnum": 25107 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 629, "pos_bol": 24999, "pos_cnum": 24999 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 632, "pos_bol": 25105, "pos_cnum": 25107 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 629, "pos_bol": 24999, "pos_cnum": 24999 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 632, "pos_bol": 25105, "pos_cnum": 25107 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 629, "pos_bol": 24999, "pos_cnum": 24999 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 632, "pos_bol": 25105, "pos_cnum": 25107 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24958 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24998 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24958 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 628, "pos_bol": 24958, "pos_cnum": 24998 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25113 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25125 }, "loc_ghost": false }, "txt2": "get_int32_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25128 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25133 }, "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/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25137 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25140 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25144 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25149 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25137 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25149 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25128 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25149 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int32_le b i] is [b]'s little-endian 32-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 635, "pos_bol": 25150, "pos_cnum": 25150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 638, "pos_bol": 25259, "pos_cnum": 25261 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 635, "pos_bol": 25150, "pos_cnum": 25150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 638, "pos_bol": 25259, "pos_cnum": 25261 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 635, "pos_bol": 25150, "pos_cnum": 25150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 638, "pos_bol": 25259, "pos_cnum": 25261 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 635, "pos_bol": 25150, "pos_cnum": 25150 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 638, "pos_bol": 25259, "pos_cnum": 25261 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25109 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25149 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25109 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 634, "pos_bol": 25109, "pos_cnum": 25149 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25267 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25279 }, "loc_ghost": false }, "txt2": "get_int64_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25282 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25287 }, "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/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25291 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25294 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25298 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25291 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25282 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int64_ne b i] is [b]'s native-endian 64-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 641, "pos_bol": 25304, "pos_cnum": 25304 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 644, "pos_bol": 25413, "pos_cnum": 25415 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 641, "pos_bol": 25304, "pos_cnum": 25304 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 644, "pos_bol": 25413, "pos_cnum": 25415 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 641, "pos_bol": 25304, "pos_cnum": 25304 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 644, "pos_bol": 25413, "pos_cnum": 25415 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 641, "pos_bol": 25304, "pos_cnum": 25304 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 644, "pos_bol": 25413, "pos_cnum": 25415 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25263 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25303 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25263 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 640, "pos_bol": 25263, "pos_cnum": 25303 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25421 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25433 }, "loc_ghost": false }, "txt2": "get_int64_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25436 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25441 }, "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/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25448 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25452 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25436 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int64_be b i] is [b]'s big-endian 64-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 647, "pos_bol": 25458, "pos_cnum": 25458 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 650, "pos_bol": 25564, "pos_cnum": 25566 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 647, "pos_bol": 25458, "pos_cnum": 25458 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 650, "pos_bol": 25564, "pos_cnum": 25566 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 647, "pos_bol": 25458, "pos_cnum": 25458 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 650, "pos_bol": 25564, "pos_cnum": 25566 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 647, "pos_bol": 25458, "pos_cnum": 25458 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 650, "pos_bol": 25564, "pos_cnum": 25566 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25417 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25457 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25417 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 646, "pos_bol": 25417, "pos_cnum": 25457 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25572 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25584 }, "loc_ghost": false }, "txt2": "get_int64_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25587 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25592 }, "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/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25596 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25599 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25603 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25608 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25596 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25608 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25587 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25608 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [get_int64_le b i] is [b]'s little-endian 64-bit integer\n starting at byte index [i].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 653, "pos_bol": 25609, "pos_cnum": 25609 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 656, "pos_bol": 25718, "pos_cnum": 25720 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 653, "pos_bol": 25609, "pos_cnum": 25609 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 656, "pos_bol": 25718, "pos_cnum": 25720 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 653, "pos_bol": 25609, "pos_cnum": 25609 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 656, "pos_bol": 25718, "pos_cnum": 25720 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 653, "pos_bol": 25609, "pos_cnum": 25609 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 656, "pos_bol": 25718, "pos_cnum": 25720 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25568 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25608 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25568 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 652, "pos_bol": 25568, "pos_cnum": 25608 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25726 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25735 }, "loc_ghost": false }, "txt2": "set_uint8" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25738 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25743 }, "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/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25747 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25750 }, "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/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25754 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25757 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25761 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25754 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25747 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25738 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_uint8 b i v] sets [b]'s unsigned 8-bit integer starting at byte index\n [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 659, "pos_bol": 25766, "pos_cnum": 25766 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 662, "pos_bol": 25877, "pos_cnum": 25879 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 659, "pos_bol": 25766, "pos_cnum": 25766 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 662, "pos_bol": 25877, "pos_cnum": 25879 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 659, "pos_bol": 25766, "pos_cnum": 25766 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 662, "pos_bol": 25877, "pos_cnum": 25879 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 659, "pos_bol": 25766, "pos_cnum": 25766 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 662, "pos_bol": 25877, "pos_cnum": 25879 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25722 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25765 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25722 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 658, "pos_bol": 25722, "pos_cnum": 25765 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25885 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25893 }, "loc_ghost": false }, "txt2": "set_int8" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25896 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25901 }, "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/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25905 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25908 }, "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/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25912 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25915 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25919 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25912 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25905 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25896 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int8 b i v] sets [b]'s signed 8-bit integer starting at byte index\n [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 665, "pos_bol": 25924, "pos_cnum": 25924 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 668, "pos_bol": 26032, "pos_cnum": 26034 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 665, "pos_bol": 25924, "pos_cnum": 25924 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 668, "pos_bol": 26032, "pos_cnum": 26034 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 665, "pos_bol": 25924, "pos_cnum": 25924 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 668, "pos_bol": 26032, "pos_cnum": 26034 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 665, "pos_bol": 25924, "pos_cnum": 25924 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 668, "pos_bol": 26032, "pos_cnum": 26034 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25881 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25923 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25881 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 664, "pos_bol": 25881, "pos_cnum": 25923 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26040 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26053 }, "loc_ghost": false }, "txt2": "set_uint16_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26056 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26061 }, "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/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26065 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26068 }, "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/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26072 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26075 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26079 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26072 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26065 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26056 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_uint16_ne b i v] sets [b]'s native-endian unsigned 16-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 671, "pos_bol": 26084, "pos_cnum": 26084 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 674, "pos_bol": 26214, "pos_cnum": 26216 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 671, "pos_bol": 26084, "pos_cnum": 26084 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 674, "pos_bol": 26214, "pos_cnum": 26216 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 671, "pos_bol": 26084, "pos_cnum": 26084 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 674, "pos_bol": 26214, "pos_cnum": 26216 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 671, "pos_bol": 26084, "pos_cnum": 26084 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 674, "pos_bol": 26214, "pos_cnum": 26216 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26036 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26083 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26036 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 670, "pos_bol": 26036, "pos_cnum": 26083 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26222 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26235 }, "loc_ghost": false }, "txt2": "set_uint16_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26238 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26243 }, "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/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26247 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26250 }, "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/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26254 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26257 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26261 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26254 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26247 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26238 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_uint16_be b i v] sets [b]'s big-endian unsigned 16-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 677, "pos_bol": 26266, "pos_cnum": 26266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 680, "pos_bol": 26393, "pos_cnum": 26395 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 677, "pos_bol": 26266, "pos_cnum": 26266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 680, "pos_bol": 26393, "pos_cnum": 26395 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 677, "pos_bol": 26266, "pos_cnum": 26266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 680, "pos_bol": 26393, "pos_cnum": 26395 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 677, "pos_bol": 26266, "pos_cnum": 26266 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 680, "pos_bol": 26393, "pos_cnum": 26395 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26218 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26265 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26218 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 676, "pos_bol": 26218, "pos_cnum": 26265 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26401 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26414 }, "loc_ghost": false }, "txt2": "set_uint16_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26417 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26422 }, "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/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26426 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26429 }, "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/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26433 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26436 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26440 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26444 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26433 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26444 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26426 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26444 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26417 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26444 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_uint16_le b i v] sets [b]'s little-endian unsigned 16-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 683, "pos_bol": 26445, "pos_cnum": 26445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 686, "pos_bol": 26575, "pos_cnum": 26577 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 683, "pos_bol": 26445, "pos_cnum": 26445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 686, "pos_bol": 26575, "pos_cnum": 26577 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 683, "pos_bol": 26445, "pos_cnum": 26445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 686, "pos_bol": 26575, "pos_cnum": 26577 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 683, "pos_bol": 26445, "pos_cnum": 26445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 686, "pos_bol": 26575, "pos_cnum": 26577 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26397 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26444 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26397 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 682, "pos_bol": 26397, "pos_cnum": 26444 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26583 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26595 }, "loc_ghost": false }, "txt2": "set_int16_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26598 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26603 }, "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/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26610 }, "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/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26614 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26617 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26621 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26625 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26614 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26625 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26607 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26625 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26598 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26625 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int16_ne b i v] sets [b]'s native-endian signed 16-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 689, "pos_bol": 26626, "pos_cnum": 26626 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 692, "pos_bol": 26753, "pos_cnum": 26755 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 689, "pos_bol": 26626, "pos_cnum": 26626 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 692, "pos_bol": 26753, "pos_cnum": 26755 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 689, "pos_bol": 26626, "pos_cnum": 26626 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 692, "pos_bol": 26753, "pos_cnum": 26755 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 689, "pos_bol": 26626, "pos_cnum": 26626 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 692, "pos_bol": 26753, "pos_cnum": 26755 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26579 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26625 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26579 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 688, "pos_bol": 26579, "pos_cnum": 26625 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26761 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26773 }, "loc_ghost": false }, "txt2": "set_int16_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26776 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26781 }, "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/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26785 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26788 }, "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/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26792 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26795 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26799 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26803 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26792 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26803 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26785 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26803 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26776 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26803 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int16_be b i v] sets [b]'s big-endian signed 16-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 695, "pos_bol": 26804, "pos_cnum": 26804 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 698, "pos_bol": 26928, "pos_cnum": 26930 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 695, "pos_bol": 26804, "pos_cnum": 26804 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 698, "pos_bol": 26928, "pos_cnum": 26930 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 695, "pos_bol": 26804, "pos_cnum": 26804 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 698, "pos_bol": 26928, "pos_cnum": 26930 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 695, "pos_bol": 26804, "pos_cnum": 26804 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 698, "pos_bol": 26928, "pos_cnum": 26930 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26757 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26803 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26757 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 694, "pos_bol": 26757, "pos_cnum": 26803 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26936 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26948 }, "loc_ghost": false }, "txt2": "set_int16_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26951 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26956 }, "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/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26960 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26963 }, "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/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26967 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26970 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26974 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26967 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26960 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26951 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int16_le b i v] sets [b]'s little-endian signed 16-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 701, "pos_bol": 26979, "pos_cnum": 26979 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 704, "pos_bol": 27106, "pos_cnum": 27108 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 701, "pos_bol": 26979, "pos_cnum": 26979 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 704, "pos_bol": 27106, "pos_cnum": 27108 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 701, "pos_bol": 26979, "pos_cnum": 26979 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 704, "pos_bol": 27106, "pos_cnum": 27108 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 701, "pos_bol": 26979, "pos_cnum": 26979 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 704, "pos_bol": 27106, "pos_cnum": 27108 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26932 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26978 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26932 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 700, "pos_bol": 26932, "pos_cnum": 26978 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27114 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27126 }, "loc_ghost": false }, "txt2": "set_int32_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27129 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27134 }, "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/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27138 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27141 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27145 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27150 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27154 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27145 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27138 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27129 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int32_ne b i v] sets [b]'s native-endian 32-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 707, "pos_bol": 27159, "pos_cnum": 27159 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 710, "pos_bol": 27279, "pos_cnum": 27281 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 707, "pos_bol": 27159, "pos_cnum": 27159 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 710, "pos_bol": 27279, "pos_cnum": 27281 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 707, "pos_bol": 27159, "pos_cnum": 27159 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 710, "pos_bol": 27279, "pos_cnum": 27281 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 707, "pos_bol": 27159, "pos_cnum": 27159 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 710, "pos_bol": 27279, "pos_cnum": 27281 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27110 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27158 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27110 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 706, "pos_bol": 27110, "pos_cnum": 27158 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27287 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27299 }, "loc_ghost": false }, "txt2": "set_int32_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27302 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27307 }, "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/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27311 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27314 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27318 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27323 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27327 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27318 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27311 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27302 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int32_be b i v] sets [b]'s big-endian 32-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 713, "pos_bol": 27332, "pos_cnum": 27332 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 716, "pos_bol": 27449, "pos_cnum": 27451 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 713, "pos_bol": 27332, "pos_cnum": 27332 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 716, "pos_bol": 27449, "pos_cnum": 27451 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 713, "pos_bol": 27332, "pos_cnum": 27332 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 716, "pos_bol": 27449, "pos_cnum": 27451 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 713, "pos_bol": 27332, "pos_cnum": 27332 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 716, "pos_bol": 27449, "pos_cnum": 27451 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27283 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27331 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27283 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 712, "pos_bol": 27283, "pos_cnum": 27331 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27457 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27469 }, "loc_ghost": false }, "txt2": "set_int32_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27472 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27477 }, "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/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27481 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27484 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27488 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27493 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27497 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27501 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27488 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27501 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27481 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27501 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27472 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27501 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int32_le b i v] sets [b]'s little-endian 32-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 719, "pos_bol": 27502, "pos_cnum": 27502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 722, "pos_bol": 27622, "pos_cnum": 27624 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 719, "pos_bol": 27502, "pos_cnum": 27502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 722, "pos_bol": 27622, "pos_cnum": 27624 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 719, "pos_bol": 27502, "pos_cnum": 27502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 722, "pos_bol": 27622, "pos_cnum": 27624 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 719, "pos_bol": 27502, "pos_cnum": 27502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 722, "pos_bol": 27622, "pos_cnum": 27624 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27453 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27501 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27453 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 718, "pos_bol": 27453, "pos_cnum": 27501 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27630 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27642 }, "loc_ghost": false }, "txt2": "set_int64_ne" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27645 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27650 }, "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/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27654 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27657 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27661 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27666 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27670 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27674 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27661 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27674 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27654 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27674 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27645 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27674 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int64_ne b i v] sets [b]'s native-endian 64-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 725, "pos_bol": 27675, "pos_cnum": 27675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 728, "pos_bol": 27795, "pos_cnum": 27797 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 725, "pos_bol": 27675, "pos_cnum": 27675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 728, "pos_bol": 27795, "pos_cnum": 27797 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 725, "pos_bol": 27675, "pos_cnum": 27675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 728, "pos_bol": 27795, "pos_cnum": 27797 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 725, "pos_bol": 27675, "pos_cnum": 27675 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 728, "pos_bol": 27795, "pos_cnum": 27797 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27626 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27674 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27626 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 724, "pos_bol": 27626, "pos_cnum": 27674 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27803 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27815 }, "loc_ghost": false }, "txt2": "set_int64_be" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27818 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27823 }, "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/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27827 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27830 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27834 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27839 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27843 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27834 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27827 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27818 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int64_be b i v] sets [b]'s big-endian 64-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 731, "pos_bol": 27848, "pos_cnum": 27848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 734, "pos_bol": 27965, "pos_cnum": 27967 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 731, "pos_bol": 27848, "pos_cnum": 27848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 734, "pos_bol": 27965, "pos_cnum": 27967 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 731, "pos_bol": 27848, "pos_cnum": 27848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 734, "pos_bol": 27965, "pos_cnum": 27967 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 731, "pos_bol": 27848, "pos_cnum": 27848 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 734, "pos_bol": 27965, "pos_cnum": 27967 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27799 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27847 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27799 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 730, "pos_bol": 27799, "pos_cnum": 27847 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27973 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27985 }, "loc_ghost": false }, "txt2": "set_int64_le" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27988 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27993 }, "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/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27997 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28004 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28009 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28013 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28017 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28004 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28017 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27997 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28017 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27988 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28017 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [set_int64_le b i v] sets [b]'s little-endian 64-bit integer\n starting at byte index [i] to [v].\n @since 4.08\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 737, "pos_bol": 28018, "pos_cnum": 28018 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 740, "pos_bol": 28138, "pos_cnum": 28140 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 737, "pos_bol": 28018, "pos_cnum": 28018 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 740, "pos_bol": 28138, "pos_cnum": 28140 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 737, "pos_bol": 28018, "pos_cnum": 28018 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 740, "pos_bol": 28138, "pos_cnum": 28140 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 737, "pos_bol": 28018, "pos_cnum": 28018 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 740, "pos_bol": 28138, "pos_cnum": 28140 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27969 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28017 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 27969 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 736, "pos_bol": 27969, "pos_cnum": 28017 }, "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:bytes_concurrency Byte sequences and concurrency safety}\n\n Care must be taken when concurrently accessing byte sequences from\n multiple domains: accessing a byte sequence will never crash a program,\n but unsynchronized accesses might yield surprising\n (non-sequentially-consistent) results.\n\n {2:byte_atomicity Atomicity}\n\n Every byte sequence operation that accesses more than one byte is not\n atomic. This includes iteration and scanning.\n\n For example, consider the following program:\n{[let size = 100_000_000\nlet b = Bytes.make size ' '\nlet update b f () =\n Bytes.iteri (fun i x -> Bytes.set b i (Char.chr (f (Char.code x)))) b\nlet d1 = Domain.spawn (update b (fun x -> x + 1))\nlet d2 = Domain.spawn (update b (fun x -> 2 * x + 1))\nlet () = Domain.join d1; Domain.join d2\n]}\n the bytes sequence [b] may contain a non-deterministic mixture\n of ['!'], ['A'], ['B'], and ['C'] values.\n\n\n After executing this code, each byte of the sequence [b] is either ['!'],\n ['A'], ['B'], or ['C']. If atomicity is required, then the user must\n implement their own synchronization (for example, using {!Mutex.t}).\n\n {2:bytes_data_race Data races}\n\n If two domains only access disjoint parts of a byte sequence, then the\n observed behaviour is the equivalent to some sequential interleaving of the\n operations from the two domains.\n\n A data race is said to occur when two domains access the same byte\n without synchronization and at least one of the accesses is a write.\n In the absence of data races, the observed behaviour is equivalent to some\n sequential interleaving of the operations from different domains.\n\n Whenever possible, data races should be avoided by using synchronization\n to mediate the accesses to the elements of the sequence.\n\n Indeed, in the presence of data races, programs will not crash but the\n observed behaviour may not be equivalent to any sequential interleaving of\n operations from different domains. Nevertheless, even in the presence of\n data races, a read operation will return the value of some prior write to\n that location.\n\n {2:bytes_mixed_access Mixed-size accesses }\n\n Another subtle point is that if a data race involves mixed-size writes and\n reads to the same location, the order in which those writes and reads\n are observed by domains is not specified.\n For instance, the following code write sequentially a 32-bit integer and a\n [char] to the same index\n{[\nlet b = Bytes.make 10 '\\000'\nlet d1 = Domain.spawn (fun () -> Bytes.set_int32_ne b 0 100; b.[0] <- 'd' )\n]}\n\n In this situation, a domain that observes the write of 'd' to b.[0] is not\n guaranteed to also observe the write to indices [1], [2], or [3].\n\n", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 743, "pos_bol": 28143, "pos_cnum": 28143 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 807, "pos_bol": 30905, "pos_cnum": 30907 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 743, "pos_bol": 28143, "pos_cnum": 28143 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 807, "pos_bol": 30905, "pos_cnum": 30907 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 743, "pos_bol": 28143, "pos_cnum": 28143 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 807, "pos_bol": 30905, "pos_cnum": 30907 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 743, "pos_bol": 28143, "pos_cnum": 28143 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 807, "pos_bol": 30905, "pos_cnum": 30907 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 743, "pos_bol": 28143, "pos_cnum": 28143 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 807, "pos_bol": 30905, "pos_cnum": 30907 }, "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", "/*", { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30909 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30916 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30909 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30916 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30909 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30916 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30909 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30916 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30909 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 809, "pos_bol": 30909, "pos_cnum": 30916 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 30994 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31004 }, "loc_ghost": false }, "txt2": "unsafe_get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31007 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31012 }, "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/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31016 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31019 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31023 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31027 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31016 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31027 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31007 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31027 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%bytes_unsafe_get" ], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 30985 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31049 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 30985 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 813, "pos_bol": 30985, "pos_cnum": 31049 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31059 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31069 }, "loc_ghost": false }, "txt2": "unsafe_set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31072 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31077 }, "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/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31081 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31084 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31088 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31092 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31096 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31100 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31088 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31100 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31081 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31100 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31072 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31100 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%bytes_unsafe_set" ], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31050 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31122 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31050 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 814, "pos_bol": 31050, "pos_cnum": 31122 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 815, "pos_bol": 31123, "pos_cnum": 31132 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 815, "pos_bol": 31123, "pos_cnum": 31143 }, "loc_ghost": false }, "txt2": "unsafe_blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31152 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31169 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31172 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31180 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31185 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31197 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31200 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31208 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31211 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31219 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31204 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31189 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31176 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31161 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 816, "pos_bol": 31146, "pos_cnum": 31148 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31223 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_blit_bytes" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31247 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31254 }, "loc_ghost": false }, "txt2": "noalloc" }, "attr_payload": [ "PStr", [] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31244 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31255 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 815, "pos_bol": 31123, "pos_cnum": 31123 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31255 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 815, "pos_bol": 31123, "pos_cnum": 31123 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 817, "pos_bol": 31215, "pos_cnum": 31255 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 818, "pos_bol": 31256, "pos_cnum": 31265 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 818, "pos_bol": 31256, "pos_cnum": 31283 }, "loc_ghost": false }, "txt2": "unsafe_blit_string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31292 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31298 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "src_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31310 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31313 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31321 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31326 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "dst_pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31338 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31341 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31349 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31356 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31345 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31330 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31317 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31302 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31288 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 819, "pos_bol": 31286, "pos_cnum": 31360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_blit_string" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 820, "pos_bol": 31361, "pos_cnum": 31387 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 820, "pos_bol": 31361, "pos_cnum": 31394 }, "loc_ghost": false }, "txt2": "noalloc" }, "attr_payload": [ "PStr", [] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 820, "pos_bol": 31361, "pos_cnum": 31384 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 820, "pos_bol": 31361, "pos_cnum": 31395 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 818, "pos_bol": 31256, "pos_cnum": 31256 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 820, "pos_bol": 31361, "pos_cnum": 31395 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 818, "pos_bol": 31256, "pos_cnum": 31256 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 820, "pos_bol": 31361, "pos_cnum": 31395 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 821, "pos_bol": 31396, "pos_cnum": 31405 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 821, "pos_bol": 31396, "pos_cnum": 31416 }, "loc_ghost": false }, "txt2": "unsafe_fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31421 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31426 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "pos" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31434 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31437 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Labelled", "len" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31445 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31448 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31452 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31456 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31460 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31452 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31441 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31430 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31421 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31464 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_fill_bytes" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31488 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31495 }, "loc_ghost": false }, "txt2": "noalloc" }, "attr_payload": [ "PStr", [] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31485 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31496 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 821, "pos_bol": 31396, "pos_cnum": 31396 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31496 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 821, "pos_bol": 31396, "pos_cnum": 31396 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 822, "pos_bol": 31419, "pos_cnum": 31496 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31502 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31515 }, "loc_ghost": false }, "txt2": "unsafe_escape" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31518 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31527 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31532 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31518 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31532 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31498 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31532 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31498 }, "loc_end": { "pos_fname": "./stdlib/bytesLabels.mli", "pos_lnum": 824, "pos_bol": 31498, "pos_cnum": 31532 }, "loc_ghost": false } } ]