[ { "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", " Message digest.\n\n This module provides functions to compute 'digests', also known as\n 'hashes', of arbitrary-length strings or files.\n The supported hashing algorithms are BLAKE2 and MD5. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 20, "pos_bol": 1221, "pos_cnum": 1279 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 20, "pos_bol": 1221, "pos_cnum": 1279 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 20, "pos_bol": 1221, "pos_cnum": 1279 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 20, "pos_bol": 1221, "pos_cnum": 1279 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 20, "pos_bol": 1221, "pos_cnum": 1279 }, "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 Basic functions} ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1281 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1307 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1281 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1307 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1281 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1307 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1281 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1307 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1281 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 22, "pos_bol": 1281, "pos_cnum": 1307 }, "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 use the MD5 hash function to produce\n 128-bit digests (16 bytes). MD5 is not cryptographically secure.\n Hence, these functions should not be used for security-sensitive\n applications. The BLAKE2 functions below are cryptographically secure. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 24, "pos_bol": 1309, "pos_cnum": 1309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 27, "pos_bol": 1517, "pos_cnum": 1594 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 24, "pos_bol": 1309, "pos_cnum": 1309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 27, "pos_bol": 1517, "pos_cnum": 1594 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 24, "pos_bol": 1309, "pos_cnum": 1309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 27, "pos_bol": 1517, "pos_cnum": 1594 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 24, "pos_bol": 1309, "pos_cnum": 1309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 27, "pos_bol": 1517, "pos_cnum": 1594 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 24, "pos_bol": 1309, "pos_cnum": 1309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 27, "pos_bol": 1517, "pos_cnum": 1594 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1601 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1602 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1605 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1611 }, "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", " The type of digests: 16-byte strings. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1612 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1656 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1612 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1656 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1612 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1656 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1612 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 30, "pos_bol": 1612, "pos_cnum": 1656 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1596 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1611 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1596 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 29, "pos_bol": 1596, "pos_cnum": 1611 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1662 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1669 }, "loc_ghost": false }, "txt2": "compare" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1672 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1673 }, "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/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1677 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1678 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1682 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1685 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1677 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1685 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1672 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1685 }, "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 16-byte digests, with the same\n specification as {!Stdlib.compare} and the implementation\n shared with {!String.compare}. Along with the type [t], this\n function [compare] allows the module [Digest] to be passed as\n argument to the functors {!Set.Make} and {!Map.Make}.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 33, "pos_bol": 1686, "pos_cnum": 1686 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 38, "pos_bol": 2000, "pos_cnum": 2018 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 33, "pos_bol": 1686, "pos_cnum": 1686 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 38, "pos_bol": 2000, "pos_cnum": 2018 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 33, "pos_bol": 1686, "pos_cnum": 1686 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 38, "pos_bol": 2000, "pos_cnum": 2018 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 33, "pos_bol": 1686, "pos_cnum": 1686 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 38, "pos_bol": 2000, "pos_cnum": 2018 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1658 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1685 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1658 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 32, "pos_bol": 1658, "pos_cnum": 1685 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2024 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2029 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2032 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2033 }, "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/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2037 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2038 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2042 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2037 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2032 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2046 }, "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 equal function for 16-byte digests.\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 41, "pos_bol": 2047, "pos_cnum": 2047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 42, "pos_bol": 2091, "pos_cnum": 2109 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 41, "pos_bol": 2047, "pos_cnum": 2047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 42, "pos_bol": 2091, "pos_cnum": 2109 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 41, "pos_bol": 2047, "pos_cnum": 2047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 42, "pos_bol": 2091, "pos_cnum": 2109 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 41, "pos_bol": 2047, "pos_cnum": 2047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 42, "pos_bol": 2091, "pos_cnum": 2109 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2020 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2046 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2020 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 40, "pos_bol": 2020, "pos_cnum": 2046 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2115 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2121 }, "loc_ghost": false }, "txt2": "string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2124 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2130 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2134 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2124 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the digest of the given string. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2136 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2181 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2136 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2181 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2136 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2181 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2136 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 45, "pos_bol": 2136, "pos_cnum": 2181 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2111 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2135 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2111 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 44, "pos_bol": 2111, "pos_cnum": 2135 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2187 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2192 }, "loc_ghost": false }, "txt2": "bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2195 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2200 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2204 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2205 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2195 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2205 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the digest of the given byte sequence.\n @since 4.02 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 48, "pos_bol": 2206, "pos_cnum": 2206 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 49, "pos_bol": 2256, "pos_cnum": 2274 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 48, "pos_bol": 2206, "pos_cnum": 2206 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 49, "pos_bol": 2256, "pos_cnum": 2274 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 48, "pos_bol": 2206, "pos_cnum": 2206 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 49, "pos_bol": 2256, "pos_cnum": 2274 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 48, "pos_bol": 2206, "pos_cnum": 2206 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 49, "pos_bol": 2256, "pos_cnum": 2274 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2183 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2205 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2183 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 47, "pos_bol": 2183, "pos_cnum": 2205 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2280 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2289 }, "loc_ghost": false }, "txt2": "substring" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2292 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2298 }, "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/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2302 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2305 }, "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/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2312 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2316 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2317 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2309 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2317 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2302 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2317 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2292 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2317 }, "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", " [Digest.substring s ofs len] returns the digest of the substring\n of [s] starting at index [ofs] and containing [len] characters. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 52, "pos_bol": 2318, "pos_cnum": 2318 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 53, "pos_bol": 2387, "pos_cnum": 2456 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 52, "pos_bol": 2318, "pos_cnum": 2318 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 53, "pos_bol": 2387, "pos_cnum": 2456 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 52, "pos_bol": 2318, "pos_cnum": 2318 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 53, "pos_bol": 2387, "pos_cnum": 2456 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 52, "pos_bol": 2318, "pos_cnum": 2318 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 53, "pos_bol": 2387, "pos_cnum": 2456 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2276 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2317 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2276 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 51, "pos_bol": 2276, "pos_cnum": 2317 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2462 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2470 }, "loc_ghost": false }, "txt2": "subbytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2473 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2478 }, "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/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2482 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2485 }, "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/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2489 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2492 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2496 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2497 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2489 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2497 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2482 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2497 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2473 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2497 }, "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", " [Digest.subbytes s ofs len] returns the digest of the subsequence\n of [s] starting at index [ofs] and containing [len] bytes.\n @since 4.02 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 56, "pos_bol": 2498, "pos_cnum": 2498 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 58, "pos_bol": 2631, "pos_cnum": 2649 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 56, "pos_bol": 2498, "pos_cnum": 2498 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 58, "pos_bol": 2631, "pos_cnum": 2649 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 56, "pos_bol": 2498, "pos_cnum": 2498 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 58, "pos_bol": 2631, "pos_cnum": 2649 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 56, "pos_bol": 2498, "pos_cnum": 2498 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 58, "pos_bol": 2631, "pos_cnum": 2649 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2458 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2497 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2458 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 55, "pos_bol": 2458, "pos_cnum": 2497 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2655 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2662 }, "loc_ghost": false }, "txt2": "channel" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "in_channel", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2665 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2675 }, "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/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2679 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2682 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2686 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2687 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2679 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2687 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2665 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2687 }, "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", " If [len] is nonnegative, [Digest.channel ic len] reads [len]\n characters from channel [ic] and returns their digest, or raises\n [End_of_file] if end-of-file is reached before [len] characters\n are read. If [len] is negative, [Digest.channel ic len] reads\n all characters from [ic] until end-of-file is reached and return\n their digest. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 61, "pos_bol": 2688, "pos_cnum": 2688 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 66, "pos_bol": 3022, "pos_cnum": 3041 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 61, "pos_bol": 2688, "pos_cnum": 2688 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 66, "pos_bol": 3022, "pos_cnum": 3041 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 61, "pos_bol": 2688, "pos_cnum": 2688 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 66, "pos_bol": 3022, "pos_cnum": 3041 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 61, "pos_bol": 2688, "pos_cnum": 2688 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 66, "pos_bol": 3022, "pos_cnum": 3041 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2651 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2687 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2651 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 60, "pos_bol": 2651, "pos_cnum": 2687 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3051 }, "loc_ghost": false }, "txt2": "file" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3054 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3060 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3064 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3065 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3054 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3065 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the digest of the file whose name is given. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3066 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3123 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3066 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3123 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3066 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3123 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3066 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 69, "pos_bol": 3066, "pos_cnum": 3123 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3043 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3065 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3043 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 68, "pos_bol": 3043, "pos_cnum": 3065 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3129 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3135 }, "loc_ghost": false }, "txt2": "output" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "out_channel", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3138 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3149 }, "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/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3153 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3154 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3158 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3162 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3153 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3162 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3138 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3162 }, "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", " Write a digest on the given output channel. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3163 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3213 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3163 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3213 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3163 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3213 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3163 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 72, "pos_bol": 3163, "pos_cnum": 3213 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3125 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3162 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3125 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 71, "pos_bol": 3125, "pos_cnum": 3162 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3219 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3224 }, "loc_ghost": false }, "txt2": "input" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "in_channel", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3227 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3241 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3242 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3227 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3242 }, "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", " Read a digest from the given input channel. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3243 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3293 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3243 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3293 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3243 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3293 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3243 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 75, "pos_bol": 3243, "pos_cnum": 3293 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3215 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3242 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3215 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 74, "pos_bol": 3215, "pos_cnum": 3242 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3299 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3305 }, "loc_ghost": false }, "txt2": "to_hex" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3308 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3309 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3313 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3319 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3308 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3319 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the printable hexadecimal representation of the given digest.\n @raise Invalid_argument if the argument is not exactly 16 bytes.\n ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 78, "pos_bol": 3320, "pos_cnum": 3320 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 80, "pos_bol": 3462, "pos_cnum": 3465 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 78, "pos_bol": 3320, "pos_cnum": 3320 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 80, "pos_bol": 3462, "pos_cnum": 3465 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 78, "pos_bol": 3320, "pos_cnum": 3320 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 80, "pos_bol": 3462, "pos_cnum": 3465 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 78, "pos_bol": 3320, "pos_cnum": 3320 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 80, "pos_bol": 3462, "pos_cnum": 3465 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3295 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3319 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3295 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 77, "pos_bol": 3295, "pos_cnum": 3319 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3471 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3477 }, "loc_ghost": false }, "txt2": "of_hex" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3480 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3486 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3490 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3491 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3480 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3491 }, "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", " Convert a hexadecimal representation back into the corresponding digest.\n @raise Invalid_argument if the argument is not exactly 32 hexadecimal\n characters.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 83, "pos_bol": 3492, "pos_cnum": 3492 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 86, "pos_bol": 3666, "pos_cnum": 3683 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 83, "pos_bol": 3492, "pos_cnum": 3492 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 86, "pos_bol": 3666, "pos_cnum": 3683 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 83, "pos_bol": 3492, "pos_cnum": 3492 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 86, "pos_bol": 3666, "pos_cnum": 3683 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 83, "pos_bol": 3492, "pos_cnum": 3492 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 86, "pos_bol": 3666, "pos_cnum": 3683 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3467 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3491 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3467 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 82, "pos_bol": 3467, "pos_cnum": 3491 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3689 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3697 }, "loc_ghost": false }, "txt2": "from_hex" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3700 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3710 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3711 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3700 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3711 }, "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 function as {!Digest.of_hex}.\n @since 4.00 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 89, "pos_bol": 3712, "pos_cnum": 3712 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 90, "pos_bol": 3751, "pos_cnum": 3769 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 89, "pos_bol": 3712, "pos_cnum": 3712 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 90, "pos_bol": 3751, "pos_cnum": 3769 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 89, "pos_bol": 3712, "pos_cnum": 3712 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 90, "pos_bol": 3751, "pos_cnum": 3769 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 89, "pos_bol": 3712, "pos_cnum": 3712 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 90, "pos_bol": 3751, "pos_cnum": 3769 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3685 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3711 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3685 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 88, "pos_bol": 3685, "pos_cnum": 3711 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {1 Generic interface} ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3771 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3799 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3771 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3799 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3771 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3799 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3771 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3799 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3771 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 92, "pos_bol": 3771, "pos_cnum": 3799 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_modtype", { "pmtd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 94, "pos_bol": 3801, "pos_cnum": 3813 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 94, "pos_bol": 3801, "pos_cnum": 3814 }, "loc_ghost": false }, "txt2": "S" }, "pmtd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3829 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3830 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3833 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3839 }, "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", " The type of digests. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3844 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3871 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3844 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3871 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3844 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3871 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3844 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 97, "pos_bol": 3840, "pos_cnum": 3871 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3824 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3839 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3824 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 96, "pos_bol": 3822, "pos_cnum": 3839 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3879 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3890 }, "loc_ghost": false }, "txt2": "hash_length" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3893 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3896 }, "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 length of digests, in bytes. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3901 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3940 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3901 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3940 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3901 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3940 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3901 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 100, "pos_bol": 3897, "pos_cnum": 3940 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3875 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3896 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3875 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 99, "pos_bol": 3873, "pos_cnum": 3896 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3948 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3955 }, "loc_ghost": false }, "txt2": "compare" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3958 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3959 }, "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/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3963 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3964 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3968 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3971 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3963 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3971 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3958 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3971 }, "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", " Compare two digests, with the same specification as\n {!Stdlib.compare}. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 103, "pos_bol": 3972, "pos_cnum": 3976 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 104, "pos_bol": 4032, "pos_cnum": 4061 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 103, "pos_bol": 3972, "pos_cnum": 3976 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 104, "pos_bol": 4032, "pos_cnum": 4061 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 103, "pos_bol": 3972, "pos_cnum": 3976 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 104, "pos_bol": 4032, "pos_cnum": 4061 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 103, "pos_bol": 3972, "pos_cnum": 3976 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 104, "pos_bol": 4032, "pos_cnum": 4061 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3944 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3971 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3944 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 102, "pos_bol": 3942, "pos_cnum": 3971 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4069 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4074 }, "loc_ghost": false }, "txt2": "equal" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4077 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4078 }, "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/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4082 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "bool", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4087 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4091 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4082 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4091 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4077 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4091 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Test two digests for equality. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4096 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4133 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4096 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4133 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4096 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4133 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4096 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 107, "pos_bol": 4092, "pos_cnum": 4133 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4065 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4091 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4065 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 106, "pos_bol": 4063, "pos_cnum": 4091 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4141 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4147 }, "loc_ghost": false }, "txt2": "string" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4150 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4156 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4160 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4161 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4150 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4161 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the digest of the given string. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4166 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4211 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4166 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4211 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4166 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4211 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4166 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 110, "pos_bol": 4162, "pos_cnum": 4211 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4137 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4161 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4137 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 109, "pos_bol": 4135, "pos_cnum": 4161 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4219 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4224 }, "loc_ghost": false }, "txt2": "bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4227 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4232 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4236 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4227 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the digest of the given byte sequence. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4242 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4294 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4242 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4294 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4242 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4294 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4242 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 113, "pos_bol": 4238, "pos_cnum": 4294 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4215 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4237 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4215 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 112, "pos_bol": 4213, "pos_cnum": 4237 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4302 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4311 }, "loc_ghost": false }, "txt2": "substring" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4314 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4320 }, "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/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4324 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4327 }, "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/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4331 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4334 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4338 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4339 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4331 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4339 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4324 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4339 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4314 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4339 }, "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", " [substring s ofs len] returns the digest of the substring\n of [s] starting at index [ofs] and containing [len] characters. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 116, "pos_bol": 4340, "pos_cnum": 4344 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 117, "pos_bol": 4406, "pos_cnum": 4480 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 116, "pos_bol": 4340, "pos_cnum": 4344 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 117, "pos_bol": 4406, "pos_cnum": 4480 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 116, "pos_bol": 4340, "pos_cnum": 4344 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 117, "pos_bol": 4406, "pos_cnum": 4480 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 116, "pos_bol": 4340, "pos_cnum": 4344 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 117, "pos_bol": 4406, "pos_cnum": 4480 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4298 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4339 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4298 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 115, "pos_bol": 4296, "pos_cnum": 4339 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4488 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4496 }, "loc_ghost": false }, "txt2": "subbytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "bytes", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4499 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4504 }, "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/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4508 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4511 }, "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/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4515 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4518 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4522 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4515 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4508 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4499 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4523 }, "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", " [subbytes s ofs len] returns the digest of the subsequence\n of [s] starting at index [ofs] and containing [len] bytes. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 120, "pos_bol": 4524, "pos_cnum": 4528 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 121, "pos_bol": 4591, "pos_cnum": 4660 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 120, "pos_bol": 4524, "pos_cnum": 4528 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 121, "pos_bol": 4591, "pos_cnum": 4660 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 120, "pos_bol": 4524, "pos_cnum": 4528 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 121, "pos_bol": 4591, "pos_cnum": 4660 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 120, "pos_bol": 4524, "pos_cnum": 4528 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 121, "pos_bol": 4591, "pos_cnum": 4660 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4484 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4523 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4484 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 119, "pos_bol": 4482, "pos_cnum": 4523 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4668 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4675 }, "loc_ghost": false }, "txt2": "channel" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "in_channel", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4678 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4688 }, "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/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4692 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4699 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4700 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4692 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4700 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4678 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4700 }, "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", " Read characters from the channel and return their digest.\n See {!Digest.channel} for the full specification. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 124, "pos_bol": 4701, "pos_cnum": 4705 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 125, "pos_bol": 4767, "pos_cnum": 4827 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 124, "pos_bol": 4701, "pos_cnum": 4705 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 125, "pos_bol": 4767, "pos_cnum": 4827 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 124, "pos_bol": 4701, "pos_cnum": 4705 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 125, "pos_bol": 4767, "pos_cnum": 4827 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 124, "pos_bol": 4701, "pos_cnum": 4705 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 125, "pos_bol": 4767, "pos_cnum": 4827 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4700 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4664 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 123, "pos_bol": 4662, "pos_cnum": 4700 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4835 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4839 }, "loc_ghost": false }, "txt2": "file" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4842 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4848 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4852 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4853 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4842 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4853 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the digest of the file whose name is given. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4858 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4915 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4858 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4915 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4858 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4915 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4858 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 128, "pos_bol": 4854, "pos_cnum": 4915 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4831 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4853 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4831 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 127, "pos_bol": 4829, "pos_cnum": 4853 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4923 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4929 }, "loc_ghost": false }, "txt2": "output" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "out_channel", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4932 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4943 }, "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/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4947 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4948 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4952 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4956 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4947 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4956 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4932 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4956 }, "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", " Write a digest on the given output channel. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 4961 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 5011 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 4961 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 5011 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 4961 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 5011 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 4961 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 131, "pos_bol": 4957, "pos_cnum": 5011 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4919 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4956 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4919 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 130, "pos_bol": 4917, "pos_cnum": 4956 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5019 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5024 }, "loc_ghost": false }, "txt2": "input" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "in_channel", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5027 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5037 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5041 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5042 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5027 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5042 }, "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", " Read a digest from the given input channel. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5097 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5097 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5097 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5047 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 134, "pos_bol": 5043, "pos_cnum": 5097 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5015 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5042 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5015 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 133, "pos_bol": 5013, "pos_cnum": 5042 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5105 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5111 }, "loc_ghost": false }, "txt2": "to_hex" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5114 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5115 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5119 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5125 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5114 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5125 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the printable hexadecimal representation of the given digest.\n @raise Invalid_argument if the length of the argument\n is not [hash_length], ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 137, "pos_bol": 5126, "pos_cnum": 5130 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 139, "pos_bol": 5265, "pos_cnum": 5297 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 137, "pos_bol": 5126, "pos_cnum": 5130 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 139, "pos_bol": 5265, "pos_cnum": 5297 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 137, "pos_bol": 5126, "pos_cnum": 5130 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 139, "pos_bol": 5265, "pos_cnum": 5297 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 137, "pos_bol": 5126, "pos_cnum": 5130 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 139, "pos_bol": 5265, "pos_cnum": 5297 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5101 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5125 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5101 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 136, "pos_bol": 5099, "pos_cnum": 5125 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5305 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5311 }, "loc_ghost": false }, "txt2": "of_hex" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "string", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5314 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5320 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5324 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5325 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5314 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5325 }, "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", " Convert a hexadecimal representation back into the corresponding digest.\n @raise Invalid_argument if the length of the argument\n is not [2 * hash_length], or if the arguments contains non-hexadecimal\n characters. ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 142, "pos_bol": 5326, "pos_cnum": 5330 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 145, "pos_bol": 5548, "pos_cnum": 5570 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 142, "pos_bol": 5326, "pos_cnum": 5330 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 145, "pos_bol": 5548, "pos_cnum": 5570 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 142, "pos_bol": 5326, "pos_cnum": 5330 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 145, "pos_bol": 5548, "pos_cnum": 5570 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 142, "pos_bol": 5326, "pos_cnum": 5330 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 145, "pos_bol": 5548, "pos_cnum": 5570 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5301 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5325 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5301 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 141, "pos_bol": 5299, "pos_cnum": 5325 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 94, "pos_bol": 3801, "pos_cnum": 3817 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 146, "pos_bol": 5571, "pos_cnum": 5574 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmtd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The signature for a hash function that produces digests of length\n [hash_length] from character strings, byte arrays, and files.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 147, "pos_bol": 5575, "pos_cnum": 5578 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 149, "pos_bol": 5717, "pos_cnum": 5737 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 147, "pos_bol": 5575, "pos_cnum": 5578 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 149, "pos_bol": 5717, "pos_cnum": 5737 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 147, "pos_bol": 5575, "pos_cnum": 5578 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 149, "pos_bol": 5717, "pos_cnum": 5737 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 147, "pos_bol": 5575, "pos_cnum": 5578 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 149, "pos_bol": 5717, "pos_cnum": 5737 }, "loc_ghost": false } } ], "pmtd_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 94, "pos_bol": 3801, "pos_cnum": 3801 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 146, "pos_bol": 5571, "pos_cnum": 5574 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 94, "pos_bol": 3801, "pos_cnum": 3801 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 146, "pos_bol": 5571, "pos_cnum": 5574 }, "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 Specific hash functions} ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5739 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5773 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5739 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5773 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5739 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5773 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5739 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5773 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5739 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 151, "pos_bol": 5739, "pos_cnum": 5773 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5782 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5790 }, "loc_ghost": false }, "txt2": "BLAKE128" }, "pmd_type": { "pmty_desc": [ "Pmty_ident", "S" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5793 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5794 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [BLAKE128] is the BLAKE2b hash function producing\n 128-bit (16-byte) digests. It is cryptographically secure.\n However, the small size of the digests enables brute-force attacks\n in [2{^64}] attempts.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 154, "pos_bol": 5795, "pos_cnum": 5797 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 158, "pos_bol": 6018, "pos_cnum": 6037 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 154, "pos_bol": 5795, "pos_cnum": 5797 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 158, "pos_bol": 6018, "pos_cnum": 6037 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 154, "pos_bol": 5795, "pos_cnum": 5797 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 158, "pos_bol": 6018, "pos_cnum": 6037 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 154, "pos_bol": 5795, "pos_cnum": 5797 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 158, "pos_bol": 6018, "pos_cnum": 6037 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5775 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5794 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5775 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 153, "pos_bol": 5775, "pos_cnum": 5794 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6046 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6054 }, "loc_ghost": false }, "txt2": "BLAKE256" }, "pmd_type": { "pmty_desc": [ "Pmty_ident", "S" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6057 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6058 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [BLAKE256] is the BLAKE2b hash function producing\n 256-bit (32-byte) digests. It is cryptographically secure,\n and the digests are large enough to thwart brute-force attacks.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 161, "pos_bol": 6059, "pos_cnum": 6061 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 164, "pos_bol": 6251, "pos_cnum": 6270 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 161, "pos_bol": 6059, "pos_cnum": 6061 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 164, "pos_bol": 6251, "pos_cnum": 6270 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 161, "pos_bol": 6059, "pos_cnum": 6061 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 164, "pos_bol": 6251, "pos_cnum": 6270 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 161, "pos_bol": 6059, "pos_cnum": 6061 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 164, "pos_bol": 6251, "pos_cnum": 6270 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6039 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6058 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6039 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 160, "pos_bol": 6039, "pos_cnum": 6058 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6279 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6287 }, "loc_ghost": false }, "txt2": "BLAKE512" }, "pmd_type": { "pmty_desc": [ "Pmty_ident", "S" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6290 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6291 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [BLAKE512] is the BLAKE2b hash function producing\n 512-bit (64-byte) digests. It is cryptographically secure,\n and the digests are large enough to thwart brute-force attacks.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 167, "pos_bol": 6292, "pos_cnum": 6294 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 170, "pos_bol": 6484, "pos_cnum": 6503 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 167, "pos_bol": 6292, "pos_cnum": 6294 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 170, "pos_bol": 6484, "pos_cnum": 6503 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 167, "pos_bol": 6292, "pos_cnum": 6294 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 170, "pos_bol": 6484, "pos_cnum": 6503 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 167, "pos_bol": 6292, "pos_cnum": 6294 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 170, "pos_bol": 6484, "pos_cnum": 6503 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6272 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6291 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6272 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 166, "pos_bol": 6272, "pos_cnum": 6291 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6512 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6515 }, "loc_ghost": false }, "txt2": "MD5" }, "pmd_type": { "pmty_desc": [ "Pmty_ident", "S" ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6518 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6519 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmd_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [MD5] is the MD5 hash function. It produces 128-bit (16-byte) digests\n and is not cryptographically secure at all. It should be used only\n for compatibility with earlier designs that mandate the use of MD5.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 173, "pos_bol": 6520, "pos_cnum": 6522 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 176, "pos_bol": 6744, "pos_cnum": 6763 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 173, "pos_bol": 6520, "pos_cnum": 6522 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 176, "pos_bol": 6744, "pos_cnum": 6763 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 173, "pos_bol": 6520, "pos_cnum": 6522 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 176, "pos_bol": 6744, "pos_cnum": 6763 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 173, "pos_bol": 6520, "pos_cnum": 6522 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 176, "pos_bol": 6744, "pos_cnum": 6763 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6505 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6519 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6505 }, "loc_end": { "pos_fname": "./stdlib/digest.mli", "pos_lnum": 172, "pos_bol": 6505, "pos_cnum": 6519 }, "loc_ghost": false } } ]