[ { "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", " Large, multi-dimensional, numerical arrays.\n\n This module implements multi-dimensional arrays of integers and\n floating-point numbers, thereafter referred to as 'Bigarrays',\n to distinguish them from the standard OCaml arrays described in\n {!module:Array}.\n\n The implementation allows efficient sharing of large numerical\n arrays between OCaml code and C or Fortran numerical libraries.\n\n The main differences between 'Bigarrays' and standard OCaml\n arrays are as follows:\n - Bigarrays are not limited in size, unlike OCaml arrays.\n (Normal float arrays are limited to 2,097,151 elements on a 32-bit\n platform, and normal arrays of other types to 4,194,303 elements.)\n - Bigarrays are multi-dimensional. Any number of dimensions\n between 0 and 16 is supported. In contrast, OCaml arrays\n are mono-dimensional and require encoding multi-dimensional\n arrays as arrays of arrays.\n - Bigarrays can only contain integers and floating-point numbers,\n while OCaml arrays can contain arbitrary OCaml data types.\n - Bigarrays provide more space-efficient storage of\n integer and floating-point elements than normal OCaml arrays, in\n particular because they support 'small' types such as\n single-precision floats and 8 and 16-bit integers, in addition to\n the standard OCaml types of double-precision floats and 32 and\n 64-bit integers.\n - The memory layout of Bigarrays is entirely compatible with that\n of arrays in C and Fortran, allowing large arrays to be passed\n back and forth between OCaml code and C / Fortran code with no\n data copying at all.\n - Bigarrays support interesting high-level operations that normal\n arrays do not provide efficiently, such as extracting sub-arrays\n and 'slicing' a multi-dimensional array along certain dimensions,\n all without any copying.\n\n Users of this module are encouraged to do [open Bigarray] in their\n source, then refer to array types and operations via short dot\n notation, e.g. [Array1.t] or [Array2.sub].\n\n Bigarrays support all the OCaml ad-hoc polymorphic operations:\n - comparisons ([=], [<>], [<=], etc, as well as {!Stdlib.compare});\n - hashing (module [Hash]);\n - and structured input-output (the functions from the\n {!Marshal} module, as well as {!Stdlib.output_value}\n and {!Stdlib.input_value}).\n", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 62, "pos_bol": 3450, "pos_cnum": 3452 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 62, "pos_bol": 3450, "pos_cnum": 3452 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 62, "pos_bol": 3450, "pos_cnum": 3452 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 62, "pos_bol": 3450, "pos_cnum": 3452 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 16, "pos_bol": 1079, "pos_cnum": 1079 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 62, "pos_bol": 3450, "pos_cnum": 3452 }, "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:elementkinds Element kinds} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3491 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3491 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3491 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3491 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 64, "pos_bol": 3454, "pos_cnum": 3491 }, "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", " Bigarrays can contain elements of the following kinds:\n- IEEE half precision (16 bits) floating-point numbers\n ({!Bigarray.float16_elt}),\n- IEEE single precision (32 bits) floating-point numbers\n ({!Bigarray.float32_elt}),\n- IEEE double precision (64 bits) floating-point numbers\n ({!Bigarray.float64_elt}),\n- IEEE single precision (2 * 32 bits) floating-point complex numbers\n ({!Bigarray.complex32_elt}),\n- IEEE double precision (2 * 64 bits) floating-point complex numbers\n ({!Bigarray.complex64_elt}),\n- 8-bit integers (signed or unsigned)\n ({!Bigarray.int8_signed_elt} or {!Bigarray.int8_unsigned_elt}),\n- 16-bit integers (signed or unsigned)\n ({!Bigarray.int16_signed_elt} or {!Bigarray.int16_unsigned_elt}),\n- OCaml integers (signed, 31 bits on 32-bit architectures,\n 63 bits on 64-bit architectures) ({!Bigarray.int_elt}),\n- 32-bit signed integers ({!Bigarray.int32_elt}),\n- 64-bit signed integers ({!Bigarray.int64_elt}),\n- platform-native signed integers (32 bits on 32-bit architectures,\n 64 bits on 64-bit architectures) ({!Bigarray.nativeint_elt}).\n\n Each element kind is represented at the type level by one of the\n [*_elt] types defined below (defined with a single constructor instead\n of abstract types for technical injectivity reasons).\n\n @since 4.07 Moved from otherlibs to stdlib.\n @since 5.2 Added float16_elt element kind.\n", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 66, "pos_bol": 3493, "pos_cnum": 3493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 94, "pos_bol": 4871, "pos_cnum": 4873 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 66, "pos_bol": 3493, "pos_cnum": 3493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 94, "pos_bol": 4871, "pos_cnum": 4873 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 66, "pos_bol": 3493, "pos_cnum": 3493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 94, "pos_bol": 4871, "pos_cnum": 4873 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 66, "pos_bol": 3493, "pos_cnum": 3493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 94, "pos_bol": 4871, "pos_cnum": 4873 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 66, "pos_bol": 3493, "pos_cnum": 3493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 94, "pos_bol": 4871, "pos_cnum": 4873 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4880 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4891 }, "loc_ghost": false }, "txt2": "float16_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4894 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4905 }, "loc_ghost": false }, "txt2": "Float16_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4894 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4905 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4875 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4905 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4875 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 96, "pos_bol": 4875, "pos_cnum": 4905 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4911 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4922 }, "loc_ghost": false }, "txt2": "float32_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4925 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4936 }, "loc_ghost": false }, "txt2": "Float32_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4925 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4936 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4906 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4936 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4906 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 97, "pos_bol": 4906, "pos_cnum": 4936 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4942 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4953 }, "loc_ghost": false }, "txt2": "float64_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4956 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4967 }, "loc_ghost": false }, "txt2": "Float64_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4956 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4967 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4937 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4967 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4937 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 98, "pos_bol": 4937, "pos_cnum": 4967 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 4973 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 4988 }, "loc_ghost": false }, "txt2": "int8_signed_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 4991 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 5006 }, "loc_ghost": false }, "txt2": "Int8_signed_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 4991 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 5006 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 4968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 5006 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 4968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 99, "pos_bol": 4968, "pos_cnum": 5006 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5012 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5029 }, "loc_ghost": false }, "txt2": "int8_unsigned_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5032 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5049 }, "loc_ghost": false }, "txt2": "Int8_unsigned_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5032 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5049 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5007 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5049 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5007 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 100, "pos_bol": 5007, "pos_cnum": 5049 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5071 }, "loc_ghost": false }, "txt2": "int16_signed_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5074 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5090 }, "loc_ghost": false }, "txt2": "Int16_signed_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5074 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5090 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5050 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5090 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5050 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 101, "pos_bol": 5050, "pos_cnum": 5090 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5114 }, "loc_ghost": false }, "txt2": "int16_unsigned_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5117 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5135 }, "loc_ghost": false }, "txt2": "Int16_unsigned_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5117 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5135 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5091 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5135 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5091 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 102, "pos_bol": 5091, "pos_cnum": 5135 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5141 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5150 }, "loc_ghost": false }, "txt2": "int32_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5162 }, "loc_ghost": false }, "txt2": "Int32_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5162 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5136 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5162 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5136 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 103, "pos_bol": 5136, "pos_cnum": 5162 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5168 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5177 }, "loc_ghost": false }, "txt2": "int64_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5180 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5189 }, "loc_ghost": false }, "txt2": "Int64_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5180 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5189 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5163 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5189 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5163 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 104, "pos_bol": 5163, "pos_cnum": 5189 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5195 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5202 }, "loc_ghost": false }, "txt2": "int_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5205 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5212 }, "loc_ghost": false }, "txt2": "Int_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5205 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5212 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5190 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5212 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5190 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 105, "pos_bol": 5190, "pos_cnum": 5212 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5218 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5231 }, "loc_ghost": false }, "txt2": "nativeint_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5234 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5247 }, "loc_ghost": false }, "txt2": "Nativeint_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5234 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5247 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5247 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 106, "pos_bol": 5213, "pos_cnum": 5247 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5253 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5266 }, "loc_ghost": false }, "txt2": "complex32_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5269 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5282 }, "loc_ghost": false }, "txt2": "Complex32_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5269 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5282 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5248 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5282 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5248 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 107, "pos_bol": 5248, "pos_cnum": 5282 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5288 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5301 }, "loc_ghost": false }, "txt2": "complex64_elt" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5304 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5317 }, "loc_ghost": false }, "txt2": "Complex64_elt" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5304 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5317 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5283 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5317 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5283 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 108, "pos_bol": 5283, "pos_cnum": 5317 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5333 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5337 }, "loc_ghost": false }, "txt2": "kind" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5327 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "NoInjectivity" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "NoInjectivity" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5351 }, "loc_ghost": false }, "txt2": "Float32" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5360 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "float32_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5362 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5373 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5354 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5342 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 111, "pos_bol": 5340, "pos_cnum": 5379 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5384 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5391 }, "loc_ghost": false }, "txt2": "Float64" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5395 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5400 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "float64_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5402 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5413 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5394 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 112, "pos_bol": 5380, "pos_cnum": 5419 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5424 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5435 }, "loc_ghost": false }, "txt2": "Int8_signed" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5439 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5442 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int8_signed_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5444 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5459 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5438 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5465 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5422 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 113, "pos_bol": 5420, "pos_cnum": 5465 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5470 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5483 }, "loc_ghost": false }, "txt2": "Int8_unsigned" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5487 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int8_unsigned_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5492 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5509 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5486 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5515 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5468 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 114, "pos_bol": 5466, "pos_cnum": 5515 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5520 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5532 }, "loc_ghost": false }, "txt2": "Int16_signed" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5536 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5539 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int16_signed_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5541 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5557 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5535 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5563 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5518 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 115, "pos_bol": 5516, "pos_cnum": 5563 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5568 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5582 }, "loc_ghost": false }, "txt2": "Int16_unsigned" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5586 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5589 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int16_unsigned_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5591 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5609 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5585 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5615 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5566 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 116, "pos_bol": 5564, "pos_cnum": 5615 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5620 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5625 }, "loc_ghost": false }, "txt2": "Int32" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5629 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int32_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5636 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5645 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5628 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5651 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5618 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 117, "pos_bol": 5616, "pos_cnum": 5651 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5656 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5661 }, "loc_ghost": false }, "txt2": "Int64" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5665 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5670 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int64_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5672 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5681 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5664 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5687 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5654 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 118, "pos_bol": 5652, "pos_cnum": 5687 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5692 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5695 }, "loc_ghost": false }, "txt2": "Int" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5699 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5702 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5704 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5711 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5698 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5717 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5690 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 119, "pos_bol": 5688, "pos_cnum": 5717 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5722 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5731 }, "loc_ghost": false }, "txt2": "Nativeint" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "nativeint", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5735 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5744 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "nativeint_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5759 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5734 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5720 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 120, "pos_bol": 5718, "pos_cnum": 5765 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5770 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5779 }, "loc_ghost": false }, "txt2": "Complex32" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "Complext", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5783 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5792 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "complex32_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5794 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5807 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5782 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5813 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5768 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 121, "pos_bol": 5766, "pos_cnum": 5813 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5827 }, "loc_ghost": false }, "txt2": "Complex64" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "Complext", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5831 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5840 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "complex64_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5842 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5855 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5830 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5861 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5816 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 122, "pos_bol": 5814, "pos_cnum": 5861 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5866 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5870 }, "loc_ghost": false }, "txt2": "Char" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5874 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5878 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int8_unsigned_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5880 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5903 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5864 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 123, "pos_bol": 5862, "pos_cnum": 5903 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5908 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5915 }, "loc_ghost": false }, "txt2": "Float16" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5919 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5924 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "float16_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5926 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5937 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5918 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5943 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5906 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5943 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " To each element kind is associated an OCaml type, which is\n the type of OCaml values that can be stored in the Bigarray\n or read back from it. This type is not necessarily the same\n as the type of the array elements proper: for instance,\n a Bigarray whose elements are of kind [float32_elt] contains\n 32-bit single precision floats, but reading or writing one of\n its elements from OCaml uses the OCaml type [float], which is\n 64-bit double precision floats.\n\n The GADT type [('a, 'b) kind] captures this association\n of an OCaml type ['a] for values read or written in the Bigarray,\n and of an element kind ['b] which represents the actual contents\n of the Bigarray. Its constructors list all possible associations\n of OCaml types with element kinds, and are re-exported below for\n backward-compatibility reasons.\n\n Using a generalized algebraic datatype (GADT) here allows writing\n well-typed polymorphic functions whose return type depend on the\n argument type, such as:\n\n{[\n let zero : type a b. (a, b) kind -> a = function\n | Float32 -> 0.0 | Complex32 -> Complex.zero\n | Float64 -> 0.0 | Complex64 -> Complex.zero\n | Float16 -> 0.0\n | Int8_signed -> 0 | Int8_unsigned -> 0\n | Int16_signed -> 0 | Int16_unsigned -> 0\n | Int32 -> 0l | Int64 -> 0L\n | Int -> 0 | Nativeint -> 0n\n | Char -> '\\000'\n]}\n\n @since 5.2 Constructor Float16 for the GADT.\n", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 125, "pos_bol": 5950, "pos_cnum": 5950 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 158, "pos_bol": 7363, "pos_cnum": 7365 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 125, "pos_bol": 5950, "pos_cnum": 5950 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 158, "pos_bol": 7363, "pos_cnum": 7365 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 125, "pos_bol": 5950, "pos_cnum": 5950 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 158, "pos_bol": 7363, "pos_cnum": 7365 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 125, "pos_bol": 5950, "pos_cnum": 5950 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 158, "pos_bol": 7363, "pos_cnum": 7365 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5319 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5943 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 110, "pos_bol": 5319, "pos_cnum": 5319 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 124, "pos_bol": 5904, "pos_cnum": 5943 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7371 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7378 }, "loc_ghost": false }, "txt2": "float16" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7387 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "float16_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7389 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7400 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7406 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}.\n @since 5.2 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 161, "pos_bol": 7407, "pos_cnum": 7407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 162, "pos_bol": 7433, "pos_cnum": 7449 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 161, "pos_bol": 7407, "pos_cnum": 7407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 162, "pos_bol": 7433, "pos_cnum": 7449 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 161, "pos_bol": 7407, "pos_cnum": 7407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 162, "pos_bol": 7433, "pos_cnum": 7449 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 161, "pos_bol": 7407, "pos_cnum": 7407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 162, "pos_bol": 7433, "pos_cnum": 7449 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7367 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7406 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7367 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 160, "pos_bol": 7367, "pos_cnum": 7406 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7455 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7462 }, "loc_ghost": false }, "txt2": "float32" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7466 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7471 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "float32_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7484 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7465 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7519 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7519 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7519 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 165, "pos_bol": 7491, "pos_cnum": 7519 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7451 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7490 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7451 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 164, "pos_bol": 7451, "pos_cnum": 7490 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7525 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7532 }, "loc_ghost": false }, "txt2": "float64" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "float", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7536 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "float64_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7543 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7535 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7589 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7589 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7589 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 168, "pos_bol": 7561, "pos_cnum": 7589 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7560 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 167, "pos_bol": 7521, "pos_cnum": 7560 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7595 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7604 }, "loc_ghost": false }, "txt2": "complex32" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "Complext", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7608 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7617 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "complex32_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7619 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7632 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7607 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7638 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7639 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7667 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7639 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7667 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7639 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7667 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7639 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 171, "pos_bol": 7639, "pos_cnum": 7667 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7591 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7638 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7591 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 170, "pos_bol": 7591, "pos_cnum": 7638 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7673 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7682 }, "loc_ghost": false }, "txt2": "complex64" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "Complext", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7686 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "complex64_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7697 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7710 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7685 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7716 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7717 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7745 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7717 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7745 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7717 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7745 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7717 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 174, "pos_bol": 7717, "pos_cnum": 7745 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7669 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7716 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7669 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 173, "pos_bol": 7669, "pos_cnum": 7716 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7751 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7762 }, "loc_ghost": false }, "txt2": "int8_signed" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7766 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7769 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int8_signed_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7771 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7786 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7765 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7792 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7793 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7821 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7793 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7821 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7793 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7821 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7793 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 177, "pos_bol": 7793, "pos_cnum": 7821 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7747 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7792 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7747 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 176, "pos_bol": 7747, "pos_cnum": 7792 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7827 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7840 }, "loc_ghost": false }, "txt2": "int8_unsigned" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7844 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int8_unsigned_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7849 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7866 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7843 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7901 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7901 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7901 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 180, "pos_bol": 7873, "pos_cnum": 7901 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7823 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7872 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7823 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 179, "pos_bol": 7823, "pos_cnum": 7872 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7907 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7919 }, "loc_ghost": false }, "txt2": "int16_signed" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7923 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7926 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int16_signed_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7928 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7944 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7922 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7950 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7951 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7979 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7951 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7979 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7951 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7979 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7951 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 183, "pos_bol": 7951, "pos_cnum": 7979 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7903 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7950 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7903 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 182, "pos_bol": 7903, "pos_cnum": 7950 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 7985 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 7999 }, "loc_ghost": false }, "txt2": "int16_unsigned" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8003 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8006 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int16_unsigned_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8008 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8026 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8032 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8061 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8061 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8061 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 186, "pos_bol": 8033, "pos_cnum": 8061 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 7981 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8032 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 7981 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 185, "pos_bol": 7981, "pos_cnum": 8032 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8067 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8070 }, "loc_ghost": false }, "txt2": "int" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8074 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8077 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8079 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8086 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8073 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8092 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char} and {!section:elementkinds}.\n\n Beware that this is a bigarray containing OCaml integers\n (signed, 31 bits on 32-bit architectures, 63 bits on 64-bit architectures),\n which does not match the [C] int type.\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 189, "pos_bol": 8093, "pos_cnum": 8093 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 194, "pos_bol": 8329, "pos_cnum": 8332 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 189, "pos_bol": 8093, "pos_cnum": 8093 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 194, "pos_bol": 8329, "pos_cnum": 8332 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 189, "pos_bol": 8093, "pos_cnum": 8093 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 194, "pos_bol": 8329, "pos_cnum": 8332 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 189, "pos_bol": 8093, "pos_cnum": 8093 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 194, "pos_bol": 8329, "pos_cnum": 8332 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8092 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 188, "pos_bol": 8063, "pos_cnum": 8092 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8343 }, "loc_ghost": false }, "txt2": "int32" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int32", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8347 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int32_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8354 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8363 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8346 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8369 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8398 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8398 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8398 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 197, "pos_bol": 8370, "pos_cnum": 8398 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8334 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8369 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8334 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 196, "pos_bol": 8334, "pos_cnum": 8369 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8404 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8409 }, "loc_ghost": false }, "txt2": "int64" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "int64", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8418 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int64_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8420 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8429 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8412 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8435 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8436 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8464 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8436 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8464 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8436 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8464 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8436 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 200, "pos_bol": 8436, "pos_cnum": 8464 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8435 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 199, "pos_bol": 8400, "pos_cnum": 8435 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8470 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8479 }, "loc_ghost": false }, "txt2": "nativeint" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "nativeint", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8483 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8492 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "nativeint_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8494 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8482 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8513 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!Bigarray.char}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8514 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8542 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8514 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8542 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8514 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8542 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8514 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 203, "pos_bol": 8514, "pos_cnum": 8542 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8466 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8513 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8466 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 202, "pos_bol": 8466, "pos_cnum": 8513 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8548 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8552 }, "loc_ghost": false }, "txt2": "char" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_constr", "char", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8556 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8560 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int8_unsigned_elt", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8562 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8579 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8555 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8585 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " As shown by the types of the values above,\n Bigarrays of kind [float16_elt], [float32_elt] and [float64_elt] are\n accessed using the OCaml type [float]. Bigarrays of complex kinds\n [complex32_elt], [complex64_elt] are accessed with the OCaml type\n {!Complex.t}. Bigarrays of\n integer kinds are accessed using the smallest OCaml integer\n type large enough to represent the array elements:\n [int] for 8- and 16-bit integer Bigarrays, as well as OCaml-integer\n Bigarrays; [int32] for 32-bit integer Bigarrays; [int64]\n for 64-bit integer Bigarrays; and [nativeint] for\n platform-native integer Bigarrays. Finally, Bigarrays of\n kind [int8_unsigned_elt] can also be accessed as arrays of\n characters instead of arrays of small integers, by using\n the kind value [char] instead of [int8_unsigned]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 206, "pos_bol": 8586, "pos_cnum": 8586 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 219, "pos_bol": 9358, "pos_cnum": 9413 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 206, "pos_bol": 8586, "pos_cnum": 8586 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 219, "pos_bol": 9358, "pos_cnum": 9413 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 206, "pos_bol": 8586, "pos_cnum": 8586 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 219, "pos_bol": 9358, "pos_cnum": 9413 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 206, "pos_bol": 8586, "pos_cnum": 8586 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 219, "pos_bol": 9358, "pos_cnum": 9413 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8585 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 205, "pos_bol": 8544, "pos_cnum": 8585 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9419 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9437 }, "loc_ghost": false }, "txt2": "kind_size_in_bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9441 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9443 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9447 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9440 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9453 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9457 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9460 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9440 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9460 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [kind_size_in_bytes k] is the number of bytes used to store\n an element of type [k].\n\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 222, "pos_bol": 9461, "pos_cnum": 9461 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 225, "pos_bol": 9553, "pos_cnum": 9570 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 222, "pos_bol": 9461, "pos_cnum": 9461 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 225, "pos_bol": 9553, "pos_cnum": 9570 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 222, "pos_bol": 9461, "pos_cnum": 9461 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 225, "pos_bol": 9553, "pos_cnum": 9570 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 222, "pos_bol": 9461, "pos_cnum": 9461 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 225, "pos_bol": 9553, "pos_cnum": 9570 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9415 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9460 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9415 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 221, "pos_bol": 9415, "pos_cnum": 9460 }, "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 Array layouts} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9572 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9596 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9572 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9596 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9572 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9596 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9572 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9596 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9572 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 227, "pos_bol": 9572, "pos_cnum": 9596 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9603 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9611 }, "loc_ghost": false }, "txt2": "c_layout" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9614 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9626 }, "loc_ghost": false }, "txt2": "C_layout_typ" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9614 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9626 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " See {!type:Bigarray.fortran_layout}.", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9674 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9674 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9674 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 230, "pos_bol": 9632, "pos_cnum": 9674 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9598 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9626 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9598 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 229, "pos_bol": 9598, "pos_cnum": 9626 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9681 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9695 }, "loc_ghost": false }, "txt2": "fortran_layout" }, "ptype_params": [], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9698 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9716 }, "loc_ghost": false }, "txt2": "Fortran_layout_typ" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": null, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9698 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9716 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " To facilitate interoperability with existing C and Fortran code,\n this library supports two different memory layouts for Bigarrays,\n one compatible with the C conventions,\n the other compatible with the Fortran conventions.\n\n In the C-style layout, array indices start at 0, and\n multi-dimensional arrays are laid out in row-major format.\n That is, for a two-dimensional array, all elements of\n row 0 are contiguous in memory, followed by all elements of\n row 1, etc. In other terms, the array elements at [(x,y)]\n and [(x, y+1)] are adjacent in memory.\n\n In the Fortran-style layout, array indices start at 1, and\n multi-dimensional arrays are laid out in column-major format.\n That is, for a two-dimensional array, all elements of\n column 0 are contiguous in memory, followed by all elements of\n column 1, etc. In other terms, the array elements at [(x,y)]\n and [(x+1, y)] are adjacent in memory.\n\n Each layout style is identified at the type level by the\n phantom types {!type:Bigarray.c_layout} and {!type:Bigarray.fortran_layout}\n respectively. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 233, "pos_bol": 9722, "pos_cnum": 9722 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 254, "pos_bol": 10797, "pos_cnum": 10816 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 233, "pos_bol": 9722, "pos_cnum": 9722 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 254, "pos_bol": 10797, "pos_cnum": 10816 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 233, "pos_bol": 9722, "pos_cnum": 9722 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 254, "pos_bol": 10797, "pos_cnum": 10816 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 233, "pos_bol": 9722, "pos_cnum": 9722 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 254, "pos_bol": 10797, "pos_cnum": 10816 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9676 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9716 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9676 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 232, "pos_bol": 9676, "pos_cnum": 9716 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_attribute", { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.text" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " {2 Supported layouts}\n\n The GADT type ['a layout] represents one of the two supported\n memory layouts: C-style or Fortran-style. Its constructors are\n re-exported as values below for backward-compatibility reasons.\n", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 256, "pos_bol": 10818, "pos_cnum": 10818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 261, "pos_bol": 11043, "pos_cnum": 11045 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 256, "pos_bol": 10818, "pos_cnum": 10818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 261, "pos_bol": 11043, "pos_cnum": 11045 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 256, "pos_bol": 10818, "pos_cnum": 10818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 261, "pos_bol": 11043, "pos_cnum": 11045 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 256, "pos_bol": 10818, "pos_cnum": 10818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 261, "pos_bol": 11043, "pos_cnum": 11045 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 256, "pos_bol": 10818, "pos_cnum": 10818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 261, "pos_bol": 11043, "pos_cnum": 11045 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 263, "pos_bol": 11047, "pos_cnum": 11055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 263, "pos_bol": 11047, "pos_cnum": 11061 }, "loc_ghost": false }, "txt2": "layout" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 263, "pos_bol": 11047, "pos_cnum": 11052 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 263, "pos_bol": 11047, "pos_cnum": 11054 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "NoInjectivity" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_variant", [ { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11068 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11076 }, "loc_ghost": false }, "txt2": "C_layout" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11078 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11086 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11078 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11093 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11068 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 264, "pos_bol": 11064, "pos_cnum": 11093 }, "loc_ghost": false }, "pcd_attributes": [] }, { "pcd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11098 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11112 }, "loc_ghost": false }, "txt2": "Fortran_layout" }, "pcd_vars": [], "pcd_args": [ "Pcstr_tuple", [] ], "pcd_res": { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11114 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11128 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11114 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11135 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pcd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11135 }, "loc_ghost": false }, "pcd_attributes": [] } ] ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 263, "pos_bol": 11047, "pos_cnum": 11047 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11135 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 263, "pos_bol": 11047, "pos_cnum": 11047 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 265, "pos_bol": 11094, "pos_cnum": 11135 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11141 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11149 }, "loc_ghost": false }, "txt2": "c_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11152 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11160 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11152 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11167 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11137 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11167 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11137 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 267, "pos_bol": 11137, "pos_cnum": 11167 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11172 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11186 }, "loc_ghost": false }, "txt2": "fortran_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11189 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11203 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11189 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11210 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11168 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11210 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11168 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 268, "pos_bol": 11168, "pos_cnum": 11210 }, "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 arrays (of arbitrarily many dimensions)} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11271 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11271 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11271 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11271 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11213 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 271, "pos_bol": 11213, "pos_cnum": 11271 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 273, "pos_bol": 11273, "pos_cnum": 11280 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 273, "pos_bol": 11273, "pos_cnum": 11288 }, "loc_ghost": false }, "txt2": "Genarray" }, "pmd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11320 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11321 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11306 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11308 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11311 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11313 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11316 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11318 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The type [Genarray.t] is the type of Bigarrays with variable\n numbers of dimensions. Any number of dimensions between 0 and 16\n is supported.\n\n The three type parameters to [Genarray.t] identify the array element\n kind and layout, as follows:\n - the first parameter, ['a], is the OCaml type for accessing array\n elements ([float], [int], [int32], [int64], [nativeint]);\n - the second parameter, ['b], is the actual kind of array elements\n ([float32_elt], [float64_elt], [int8_signed_elt], [int8_unsigned_elt],\n etc);\n - the third parameter, ['c], identifies the array layout\n ([c_layout] or [fortran_layout]).\n\n For instance, [(float, float32_elt, fortran_layout) Genarray.t]\n is the type of generic Bigarrays containing 32-bit floats\n in Fortran layout; reads and writes in this array use the\n OCaml type [float]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 276, "pos_bol": 11322, "pos_cnum": 11324 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 293, "pos_bol": 12187, "pos_cnum": 12214 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 276, "pos_bol": 11322, "pos_cnum": 11324 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 293, "pos_bol": 12187, "pos_cnum": 12214 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 276, "pos_bol": 11322, "pos_cnum": 11324 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 293, "pos_bol": 12187, "pos_cnum": 12214 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 276, "pos_bol": 11322, "pos_cnum": 11324 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 293, "pos_bol": 12187, "pos_cnum": 12214 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11299 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11321 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11299 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 275, "pos_bol": 11297, "pos_cnum": 11321 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12227 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12233 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12236 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12238 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12242 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12235 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12248 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12252 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12254 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12252 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12261 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12265 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12268 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12265 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12274 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12279 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12281 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12283 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12285 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12287 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12289 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12278 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12292 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12265 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12292 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12252 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12292 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12235 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12292 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_create" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Genarray.create kind layout dimensions] returns a new Bigarray\n whose element kind is determined by the parameter [kind] (one of\n [float32], [float64], [int8_signed], etc) and whose layout is\n determined by the parameter [layout] (one of [c_layout] or\n [fortran_layout]). The [dimensions] parameter is an array of\n integers that indicate the size of the Bigarray in each dimension.\n The length of [dimensions] determines the number of dimensions\n of the Bigarray.\n\n For instance, [Genarray.create int32 c_layout [|4;6;8|]]\n returns a fresh Bigarray of 32-bit integers, in C layout,\n having three dimensions, the three dimensions being 4, 6 and 8\n respectively.\n\n Bigarrays returned by [Genarray.create] are not initialized:\n the initial values of array elements is unspecified.\n\n [Genarray.create] raises [Invalid_argument] if the number of dimensions\n is not in the range 0 to 16 inclusive, or if one of the dimensions\n is negative. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 297, "pos_bol": 12316, "pos_cnum": 12318 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 316, "pos_bol": 13304, "pos_cnum": 13324 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 297, "pos_bol": 12316, "pos_cnum": 12318 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 316, "pos_bol": 13304, "pos_cnum": 13324 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 297, "pos_bol": 12316, "pos_cnum": 12318 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 316, "pos_bol": 13304, "pos_cnum": 13324 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 297, "pos_bol": 12316, "pos_cnum": 12318 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 316, "pos_bol": 13304, "pos_cnum": 13324 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12218 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 296, "pos_bol": 12293, "pos_cnum": 12315 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 295, "pos_bol": 12216, "pos_cnum": 12218 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 296, "pos_bol": 12293, "pos_cnum": 12315 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13332 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13336 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13339 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13341 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13343 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13345 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13351 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13357 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13364 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13368 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13371 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13368 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13385 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13391 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13395 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13397 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13397 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13415 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13417 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13419 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13421 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13423 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13425 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13414 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13368 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Genarray.init kind layout dimensions f] returns a new Bigarray [b]\n whose element kind is determined by the parameter [kind] (one of\n [float32], [float64], [int8_signed], etc) and whose layout is\n determined by the parameter [layout] (one of [c_layout] or\n [fortran_layout]). The [dimensions] parameter is an array of\n integers that indicate the size of the Bigarray in each dimension.\n The length of [dimensions] determines the number of dimensions\n of the Bigarray.\n\n Each element [Genarray.get b i] is initialized to the result of [f i].\n In other words, [Genarray.init kind layout dimensions f] tabulates\n the results of [f] applied to the indices of a new Bigarray whose\n layout is described by [kind], [layout] and [dimensions]. The index\n array [i] may be shared and mutated between calls to f.\n\n For instance, [Genarray.init int c_layout [|2; 1; 3|]\n (Array.fold_left (+) 0)] returns a fresh Bigarray of integers, in C\n layout, having three dimensions (2, 1, 3, respectively), with the\n element values 0, 1, 2, 1, 2, 3.\n\n [Genarray.init] raises [Invalid_argument] if the number of dimensions\n is not in the range 0 to 16 inclusive, or if one of the dimensions\n is negative.\n\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 320, "pos_bol": 13429, "pos_cnum": 13431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 344, "pos_bol": 14716, "pos_cnum": 14736 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 320, "pos_bol": 13429, "pos_cnum": 13431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 344, "pos_bol": 14716, "pos_cnum": 14736 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 320, "pos_bol": 13429, "pos_cnum": 13431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 344, "pos_bol": 14716, "pos_cnum": 14736 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 320, "pos_bol": 13429, "pos_cnum": 13431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 344, "pos_bol": 14716, "pos_cnum": 14736 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13328 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 318, "pos_bol": 13326, "pos_cnum": 13328 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 319, "pos_bol": 13402, "pos_cnum": 13428 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14749 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14757 }, "loc_ghost": false }, "txt2": "num_dims" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14760 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14764 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14766 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14768 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14770 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14759 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14773 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14777 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14780 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14759 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14780 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_num_dims" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Return the number of dimensions of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14865 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14865 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14865 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 347, "pos_bol": 14802, "pos_cnum": 14865 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14740 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14801 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14740 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 346, "pos_bol": 14738, "pos_cnum": 14801 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14877 }, "loc_ghost": false }, "txt2": "dims" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14881 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14883 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14885 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14887 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14889 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14891 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14880 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14894 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14898 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14901 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14898 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14907 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14880 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14907 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Genarray.dims a] returns all dimensions of the Bigarray [a],\n as an array of integers of length [Genarray.num_dims a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 350, "pos_bol": 14908, "pos_cnum": 14910 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 351, "pos_bol": 14976, "pos_cnum": 15040 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 350, "pos_bol": 14908, "pos_cnum": 14910 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 351, "pos_bol": 14976, "pos_cnum": 15040 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 350, "pos_bol": 14908, "pos_cnum": 14910 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 351, "pos_bol": 14976, "pos_cnum": 15040 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 350, "pos_bol": 14908, "pos_cnum": 14910 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 351, "pos_bol": 14976, "pos_cnum": 15040 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14869 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14907 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14869 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 349, "pos_bol": 14867, "pos_cnum": 14907 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15053 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15060 }, "loc_ghost": false }, "txt2": "nth_dim" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15065 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15067 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15069 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15071 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15073 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15062 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15076 }, "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/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15080 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15087 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15090 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15080 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15090 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15062 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15090 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_dim" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Genarray.nth_dim a n] returns the [n]-th dimension of the\n Bigarray [a]. The first dimension corresponds to [n = 0];\n the second dimension corresponds to [n = 1]; the last dimension,\n to [n = Genarray.num_dims a - 1].\n @raise Invalid_argument if [n] is less than 0 or greater or equal than\n [Genarray.num_dims a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 354, "pos_bol": 15107, "pos_cnum": 15109 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 359, "pos_bol": 15421, "pos_cnum": 15451 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 354, "pos_bol": 15107, "pos_cnum": 15109 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 359, "pos_bol": 15421, "pos_cnum": 15451 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 354, "pos_bol": 15107, "pos_cnum": 15109 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 359, "pos_bol": 15421, "pos_cnum": 15451 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 354, "pos_bol": 15107, "pos_cnum": 15109 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 359, "pos_bol": 15421, "pos_cnum": 15451 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15044 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15106 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15044 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 353, "pos_bol": 15042, "pos_cnum": 15106 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15464 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15468 }, "loc_ghost": false }, "txt2": "kind" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15471 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15473 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15475 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15477 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15479 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15481 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15470 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15484 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15489 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15491 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15495 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15488 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15501 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15470 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15501 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_kind" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 kind of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15566 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15566 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15566 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 362, "pos_bol": 15519, "pos_cnum": 15566 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15455 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15518 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15455 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 361, "pos_bol": 15453, "pos_cnum": 15518 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15579 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15585 }, "loc_ghost": false }, "txt2": "layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15588 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15590 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15592 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15594 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15596 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15598 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15587 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15601 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15605 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15607 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15605 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15614 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15587 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15614 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_layout" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 layout of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15636 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15683 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15636 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15683 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15636 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15683 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15636 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 365, "pos_bol": 15634, "pos_cnum": 15683 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15570 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15633 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15570 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 364, "pos_bol": 15568, "pos_cnum": 15633 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15696 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15709 }, "loc_ghost": false }, "txt2": "change_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15712 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15714 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15716 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15718 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15720 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15722 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15711 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15725 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15729 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15731 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15729 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15738 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15743 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15745 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15747 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15749 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15751 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15753 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15742 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15756 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15729 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15756 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15711 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15756 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_change_layout" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Genarray.change_layout a layout] returns a Bigarray with the\n specified [layout], sharing the data with [a] (and hence having\n the same dimensions as [a]). No copying of elements is involved: the\n new array and the original array share the same storage space.\n The dimensions are reversed, such that [get v [| a; b |]] in\n C layout becomes [get v [| b+1; a+1 |]] in Fortran layout.\n\n @since 4.04\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 369, "pos_bol": 15789, "pos_cnum": 15791 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 377, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 369, "pos_bol": 15789, "pos_cnum": 15791 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 377, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 369, "pos_bol": 15789, "pos_cnum": 15791 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 377, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 369, "pos_bol": 15789, "pos_cnum": 15791 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 377, "pos_bol": 16222, "pos_cnum": 16226 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15687 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 368, "pos_bol": 15757, "pos_cnum": 15788 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 367, "pos_bol": 15685, "pos_cnum": 15687 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 368, "pos_bol": 15757, "pos_cnum": 15788 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16234 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16247 }, "loc_ghost": false }, "txt2": "size_in_bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16251 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16253 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16255 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16257 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16259 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16261 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16250 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16264 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16271 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16250 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16271 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [size_in_bytes a] is the number of elements in [a] multiplied\n by [a]'s {!kind_size_in_bytes}.\n\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 380, "pos_bol": 16272, "pos_cnum": 16274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 383, "pos_bol": 16377, "pos_cnum": 16395 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 380, "pos_bol": 16272, "pos_cnum": 16274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 383, "pos_bol": 16377, "pos_cnum": 16395 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 380, "pos_bol": 16272, "pos_cnum": 16274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 383, "pos_bol": 16377, "pos_cnum": 16395 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 380, "pos_bol": 16272, "pos_cnum": 16274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 383, "pos_bol": 16377, "pos_cnum": 16395 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16230 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16271 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16230 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 379, "pos_bol": 16228, "pos_cnum": 16271 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16408 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16411 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16414 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16416 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16418 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16420 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16422 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16424 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16427 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16434 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16440 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16444 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16431 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_get_generic" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 an element of a generic Bigarray.\n [Genarray.get a [|i1; ...; iN|]] returns the element of [a]\n whose coordinates are [i1] in the first dimension, [i2] in\n the second dimension, ..., [iN] in the [N]-th dimension.\n\n If [a] has C layout, the coordinates must be greater or equal than 0\n and strictly less than the corresponding dimensions of [a].\n If [a] has Fortran layout, the coordinates must be greater or equal\n than 1 and less or equal than the corresponding dimensions of [a].\n\n If [N > 3], alternate syntax is provided: you can write\n [a.{i1, i2, ..., iN}] instead of [Genarray.get a [|i1; ...; iN|]].\n (The syntax [a.{...}] with one, two or three coordinates is\n reserved for accessing one-, two- and three-dimensional arrays\n as described below.)\n\n @raise Invalid_argument if the array [a] does not have exactly [N]\n dimensions, or if the coordinates are outside the array bounds.\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 386, "pos_bol": 16471, "pos_cnum": 16473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 404, "pos_bol": 17427, "pos_cnum": 17431 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 386, "pos_bol": 16471, "pos_cnum": 16473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 404, "pos_bol": 17427, "pos_cnum": 17431 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 386, "pos_bol": 16471, "pos_cnum": 16473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 404, "pos_bol": 17427, "pos_cnum": 17431 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 386, "pos_bol": 16471, "pos_cnum": 16473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 404, "pos_bol": 17427, "pos_cnum": 17431 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16470 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 385, "pos_bol": 16397, "pos_cnum": 16470 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17444 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17447 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17450 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17452 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17456 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17460 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17449 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17476 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17480 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17482 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17486 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17480 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17449 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17490 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_set_generic" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Assign an element of a generic Bigarray.\n [Genarray.set a [|i1; ...; iN|] v] stores the value [v] in the\n element of [a] whose coordinates are [i1] in the first dimension,\n [i2] in the second dimension, ..., [iN] in the [N]-th dimension.\n\n The array [a] must have exactly [N] dimensions, and all coordinates\n must lie inside the array bounds, as described for [Genarray.get];\n otherwise, [Invalid_argument] is raised.\n\n If [N > 3], alternate syntax is provided: you can write\n [a.{i1, i2, ..., iN} <- v] instead of\n [Genarray.set a [|i1; ...; iN|] v].\n (The syntax [a.{...} <- v] with one, two or three coordinates is\n reserved for updating one-, two- and three-dimensional arrays\n as described below.) ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 408, "pos_bol": 17519, "pos_cnum": 17521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 422, "pos_bol": 18250, "pos_cnum": 18278 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 408, "pos_bol": 17519, "pos_cnum": 17521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 422, "pos_bol": 18250, "pos_cnum": 18278 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 408, "pos_bol": 17519, "pos_cnum": 17521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 422, "pos_bol": 18250, "pos_cnum": 18278 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 408, "pos_bol": 17519, "pos_cnum": 17521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 422, "pos_bol": 18250, "pos_cnum": 18278 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17435 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 407, "pos_bol": 17491, "pos_cnum": 17518 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 406, "pos_bol": 17433, "pos_cnum": 17435 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 407, "pos_bol": 17491, "pos_cnum": 17518 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18291 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18299 }, "loc_ghost": false }, "txt2": "sub_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18304 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18306 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18308 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18310 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18318 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18301 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18321 }, "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/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18328 }, "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/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18332 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18335 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18340 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18342 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18346 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18348 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18356 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18339 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18332 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18301 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a sub-array of the given Bigarray by restricting the\n first (left-most) dimension. [Genarray.sub_left a ofs len]\n returns a Bigarray with the same number of dimensions as [a],\n and the same dimensions as [a], except the first dimension,\n which corresponds to the interval [[ofs ... ofs + len - 1]]\n of the first dimension of [a]. No copying of elements is\n involved: the sub-array and the original array share the same\n storage space. In other terms, the element at coordinates\n [[|i1; ...; iN|]] of the sub-array is identical to the\n element at coordinates [[|i1+ofs; ...; iN|]] of the original\n array [a].\n\n [Genarray.sub_left] applies only to Bigarrays in C layout.\n @raise Invalid_argument if [ofs] and [len] do not designate\n a valid sub-array of [a], that is, if [ofs < 0], or [len < 0],\n or [ofs + len > Genarray.nth_dim a 0]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 426, "pos_bol": 18380, "pos_cnum": 18382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 441, "pos_bol": 19243, "pos_cnum": 19289 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 426, "pos_bol": 18380, "pos_cnum": 18382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 441, "pos_bol": 19243, "pos_cnum": 19289 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 426, "pos_bol": 18380, "pos_cnum": 18382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 441, "pos_bol": 19243, "pos_cnum": 19289 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 426, "pos_bol": 18380, "pos_cnum": 18382 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 441, "pos_bol": 19243, "pos_cnum": 19289 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18282 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 425, "pos_bol": 18360, "pos_cnum": 18379 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 424, "pos_bol": 18280, "pos_cnum": 18282 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 425, "pos_bol": 18360, "pos_cnum": 18379 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 443, "pos_bol": 19291, "pos_cnum": 19302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 443, "pos_bol": 19291, "pos_cnum": 19311 }, "loc_ghost": false }, "txt2": "sub_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19318 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19320 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19324 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19326 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19340 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19317 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19343 }, "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/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19347 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19350 }, "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/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19354 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19357 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19362 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19364 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19366 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19368 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19384 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19361 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19387 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19354 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19387 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19347 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19387 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19317 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 444, "pos_bol": 19313, "pos_cnum": 19387 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a sub-array of the given Bigarray by restricting the\n last (right-most) dimension. [Genarray.sub_right a ofs len]\n returns a Bigarray with the same number of dimensions as [a],\n and the same dimensions as [a], except the last dimension,\n which corresponds to the interval [[ofs ... ofs + len - 1]]\n of the last dimension of [a]. No copying of elements is\n involved: the sub-array and the original array share the same\n storage space. In other terms, the element at coordinates\n [[|i1; ...; iN|]] of the sub-array is identical to the\n element at coordinates [[|i1; ...; iN+ofs|]] of the original\n array [a].\n\n [Genarray.sub_right] applies only to Bigarrays in Fortran layout.\n @raise Invalid_argument if [ofs] and [len] do not designate\n a valid sub-array of [a], that is, if [ofs < 1], or [len < 0],\n or [ofs + len > Genarray.nth_dim a (Genarray.num_dims a - 1)]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 446, "pos_bol": 19408, "pos_cnum": 19410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 461, "pos_bol": 20277, "pos_cnum": 20347 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 446, "pos_bol": 19408, "pos_cnum": 19410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 461, "pos_bol": 20277, "pos_cnum": 20347 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 446, "pos_bol": 19408, "pos_cnum": 19410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 461, "pos_bol": 20277, "pos_cnum": 20347 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 446, "pos_bol": 19408, "pos_cnum": 19410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 461, "pos_bol": 20277, "pos_cnum": 20347 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 443, "pos_bol": 19291, "pos_cnum": 19293 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 445, "pos_bol": 19388, "pos_cnum": 19407 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 443, "pos_bol": 19291, "pos_cnum": 19293 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 445, "pos_bol": 19388, "pos_cnum": 19407 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 463, "pos_bol": 20349, "pos_cnum": 20360 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 463, "pos_bol": 20349, "pos_cnum": 20370 }, "loc_ghost": false }, "txt2": "slice_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20383 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20385 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20393 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20376 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20396 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20403 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20409 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20414 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20416 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20418 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20420 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20422 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20430 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20433 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20433 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20376 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 464, "pos_bol": 20372, "pos_cnum": 20433 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_slice" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a sub-array of lower dimension from the given Bigarray\n by fixing one or several of the first (left-most) coordinates.\n [Genarray.slice_left a [|i1; ... ; iM|]] returns the 'slice'\n of [a] obtained by setting the first [M] coordinates to\n [i1], ..., [iM]. If [a] has [N] dimensions, the slice has\n dimension [N - M], and the element at coordinates\n [[|j1; ...; j(N-M)|]] in the slice is identical to the element\n at coordinates [[|i1; ...; iM; j1; ...; j(N-M)|]] in the original\n array [a]. No copying of elements is involved: the slice and\n the original array share the same storage space.\n\n [Genarray.slice_left] applies only to Bigarrays in C layout.\n @raise Invalid_argument if [M >= N], or if [[|i1; ... ; iM|]]\n is outside the bounds of [a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 466, "pos_bol": 20456, "pos_cnum": 20458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 479, "pos_bol": 21233, "pos_cnum": 21270 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 466, "pos_bol": 20456, "pos_cnum": 20458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 479, "pos_bol": 21233, "pos_cnum": 21270 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 466, "pos_bol": 20456, "pos_cnum": 20458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 479, "pos_bol": 21233, "pos_cnum": 21270 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 466, "pos_bol": 20456, "pos_cnum": 20458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 479, "pos_bol": 21233, "pos_cnum": 21270 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 463, "pos_bol": 20349, "pos_cnum": 20351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 465, "pos_bol": 20434, "pos_cnum": 20455 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 463, "pos_bol": 20349, "pos_cnum": 20351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 465, "pos_bol": 20434, "pos_cnum": 20455 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 481, "pos_bol": 21272, "pos_cnum": 21283 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 481, "pos_bol": 21272, "pos_cnum": 21294 }, "loc_ghost": false }, "txt2": "slice_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21301 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21303 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21305 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21307 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21309 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21323 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21300 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21326 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21333 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21339 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21346 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21348 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21352 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21343 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21369 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21369 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21300 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 482, "pos_bol": 21296, "pos_cnum": 21369 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_slice" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a sub-array of lower dimension from the given Bigarray\n by fixing one or several of the last (right-most) coordinates.\n [Genarray.slice_right a [|i1; ... ; iM|]] returns the 'slice'\n of [a] obtained by setting the last [M] coordinates to\n [i1], ..., [iM]. If [a] has [N] dimensions, the slice has\n dimension [N - M], and the element at coordinates\n [[|j1; ...; j(N-M)|]] in the slice is identical to the element\n at coordinates [[|j1; ...; j(N-M); i1; ...; iM|]] in the original\n array [a]. No copying of elements is involved: the slice and\n the original array share the same storage space.\n\n [Genarray.slice_right] applies only to Bigarrays in Fortran layout.\n @raise Invalid_argument if [M >= N], or if [[|i1; ... ; iM|]]\n is outside the bounds of [a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 484, "pos_bol": 21392, "pos_cnum": 21394 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 497, "pos_bol": 22176, "pos_cnum": 22213 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 484, "pos_bol": 21392, "pos_cnum": 21394 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 497, "pos_bol": 22176, "pos_cnum": 22213 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 484, "pos_bol": 21392, "pos_cnum": 21394 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 497, "pos_bol": 22176, "pos_cnum": 22213 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 484, "pos_bol": 21392, "pos_cnum": 21394 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 497, "pos_bol": 22176, "pos_cnum": 22213 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 481, "pos_bol": 21272, "pos_cnum": 21274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 483, "pos_bol": 21370, "pos_cnum": 21391 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 481, "pos_bol": 21272, "pos_cnum": 21274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 483, "pos_bol": 21370, "pos_cnum": 21391 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22226 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22230 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22233 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22235 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22237 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22239 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22241 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22243 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22232 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22251 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22253 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22255 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22257 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22259 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22261 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22250 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22264 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22272 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22250 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22272 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22232 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22272 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_blit" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Copy all elements of a Bigarray in another Bigarray.\n [Genarray.blit src dst] copies all elements of [src] into\n [dst]. Both arrays [src] and [dst] must have the same number of\n dimensions and equal dimensions. Copying a sub-array of [src]\n to a sub-array of [dst] can be achieved by applying [Genarray.blit]\n to sub-array or slices of [src] and [dst]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 501, "pos_bol": 22296, "pos_cnum": 22298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 506, "pos_bol": 22629, "pos_cnum": 22679 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 501, "pos_bol": 22296, "pos_cnum": 22298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 506, "pos_bol": 22629, "pos_cnum": 22679 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 501, "pos_bol": 22296, "pos_cnum": 22298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 506, "pos_bol": 22629, "pos_cnum": 22679 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 501, "pos_bol": 22296, "pos_cnum": 22298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 506, "pos_bol": 22629, "pos_cnum": 22679 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22217 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 500, "pos_bol": 22273, "pos_cnum": 22295 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 499, "pos_bol": 22215, "pos_cnum": 22217 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 500, "pos_bol": 22273, "pos_cnum": 22295 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22692 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22696 }, "loc_ghost": false }, "txt2": "fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22699 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22701 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22703 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22705 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22707 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22698 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22712 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22716 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22718 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22722 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22726 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22716 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22726 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22698 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22726 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_fill" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Set all elements of a Bigarray to a given value.\n [Genarray.fill a v] stores the value [v] in all elements of\n the Bigarray [a]. Setting only some elements of [a] to [v]\n can be achieved by applying [Genarray.fill] to a sub-array\n or a slice of [a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 509, "pos_bol": 22744, "pos_cnum": 22746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 513, "pos_bol": 22993, "pos_cnum": 23019 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 509, "pos_bol": 22744, "pos_cnum": 22746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 513, "pos_bol": 22993, "pos_cnum": 23019 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 509, "pos_bol": 22744, "pos_cnum": 22746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 513, "pos_bol": 22993, "pos_cnum": 23019 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 509, "pos_bol": 22744, "pos_cnum": 22746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 513, "pos_bol": 22993, "pos_cnum": 23019 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22683 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22743 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22683 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 508, "pos_bol": 22681, "pos_cnum": 22743 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 274, "pos_bol": 11291, "pos_cnum": 11293 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 514, "pos_bol": 23020, "pos_cnum": 23025 }, "loc_ghost": false }, "pmty_attributes": [] }, "pmd_attributes": [], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 273, "pos_bol": 11273, "pos_cnum": 11273 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 514, "pos_bol": 23020, "pos_cnum": 23025 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 273, "pos_bol": 11273, "pos_cnum": 11273 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 514, "pos_bol": 23020, "pos_cnum": 23025 }, "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 Zero-dimensional arrays} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23027 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23061 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23027 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23061 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23027 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23061 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23027 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23061 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23027 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 516, "pos_bol": 23027, "pos_cnum": 23061 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 524, "pos_bol": 23425, "pos_cnum": 23432 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 524, "pos_bol": 23425, "pos_cnum": 23438 }, "loc_ghost": false }, "txt2": "Array0" }, "pmd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23468 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23469 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23454 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23456 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23459 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23461 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23464 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23466 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The type of zero-dimensional Bigarrays whose elements have\n OCaml type ['a], representation kind ['b], and memory layout ['c]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 526, "pos_bol": 23470, "pos_cnum": 23472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 527, "pos_bol": 23535, "pos_cnum": 23609 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 526, "pos_bol": 23470, "pos_cnum": 23472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 527, "pos_bol": 23535, "pos_cnum": 23609 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 526, "pos_bol": 23470, "pos_cnum": 23472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 527, "pos_bol": 23535, "pos_cnum": 23609 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 526, "pos_bol": 23470, "pos_cnum": 23472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 527, "pos_bol": 23535, "pos_cnum": 23609 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23447 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23469 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23447 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 525, "pos_bol": 23445, "pos_cnum": 23469 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23617 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23623 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23626 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23628 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23630 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23632 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23625 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23638 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23642 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23644 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23642 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23651 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23656 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23658 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23660 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23662 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23664 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23666 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23655 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23642 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23625 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23669 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array0.create kind layout] returns a new Bigarray of zero dimension.\n [kind] and [layout] determine the array element kind and the array\n layout as described for {!Genarray.create}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 530, "pos_bol": 23670, "pos_cnum": 23672 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 532, "pos_bol": 23818, "pos_cnum": 23869 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 530, "pos_bol": 23670, "pos_cnum": 23672 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 532, "pos_bol": 23818, "pos_cnum": 23869 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 530, "pos_bol": 23670, "pos_cnum": 23672 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 532, "pos_bol": 23818, "pos_cnum": 23869 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 530, "pos_bol": 23670, "pos_cnum": 23672 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 532, "pos_bol": 23818, "pos_cnum": 23869 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23613 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23669 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23613 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 529, "pos_bol": 23611, "pos_cnum": 23669 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23877 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23881 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23884 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23886 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23888 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23890 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23883 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23896 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23902 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23909 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23913 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23915 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23920 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23922 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23924 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23926 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23928 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23930 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23919 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23913 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23883 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23933 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array0.init kind layout v] behaves like [Array0.create kind layout]\n except that the element is additionally initialized to the value [v].\n\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 535, "pos_bol": 23934, "pos_cnum": 23936 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 538, "pos_bol": 24085, "pos_cnum": 24104 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 535, "pos_bol": 23934, "pos_cnum": 23936 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 538, "pos_bol": 24085, "pos_cnum": 24104 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 535, "pos_bol": 23934, "pos_cnum": 23936 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 538, "pos_bol": 24085, "pos_cnum": 24104 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 535, "pos_bol": 23934, "pos_cnum": 23936 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 538, "pos_bol": 24085, "pos_cnum": 24104 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23933 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23873 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 534, "pos_bol": 23871, "pos_cnum": 23933 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24117 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24121 }, "loc_ghost": false }, "txt2": "kind" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24124 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24126 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24128 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24130 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24132 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24134 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24123 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24137 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24142 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24144 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24146 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24141 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24154 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24123 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24154 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_kind" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 kind of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24219 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24219 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24219 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 541, "pos_bol": 24172, "pos_cnum": 24219 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24108 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24171 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24108 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 540, "pos_bol": 24106, "pos_cnum": 24171 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24232 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24238 }, "loc_ghost": false }, "txt2": "layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24241 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24243 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24245 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24247 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24249 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24251 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24254 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24258 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24260 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24258 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24267 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24267 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_layout" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 layout of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24336 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24336 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24336 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 544, "pos_bol": 24287, "pos_cnum": 24336 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24223 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24286 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24223 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 543, "pos_bol": 24221, "pos_cnum": 24286 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24357 }, "loc_ghost": false }, "txt2": "change_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24360 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24362 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24364 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24366 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24368 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24370 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24359 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24373 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24386 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24391 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24393 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24395 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24397 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24401 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24390 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24404 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24404 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24359 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24404 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array0.change_layout a layout] returns a Bigarray with the\n specified [layout], sharing the data with [a]. No copying of elements\n is involved: the new array and the original array share the same\n storage space.\n\n @since 4.06\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 547, "pos_bol": 24405, "pos_cnum": 24407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 553, "pos_bol": 24658, "pos_cnum": 24662 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 547, "pos_bol": 24405, "pos_cnum": 24407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 553, "pos_bol": 24658, "pos_cnum": 24662 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 547, "pos_bol": 24405, "pos_cnum": 24407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 553, "pos_bol": 24658, "pos_cnum": 24662 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 547, "pos_bol": 24405, "pos_cnum": 24407 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 553, "pos_bol": 24658, "pos_cnum": 24662 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24340 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24404 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24340 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 546, "pos_bol": 24338, "pos_cnum": 24404 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24670 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24683 }, "loc_ghost": false }, "txt2": "size_in_bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24687 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24689 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24691 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24693 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24695 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24697 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24686 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24700 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24704 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24707 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24686 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24707 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [size_in_bytes a] is [a]'s {!kind_size_in_bytes}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24710 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24766 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24710 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24766 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24710 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24766 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24710 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 556, "pos_bol": 24708, "pos_cnum": 24766 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24666 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24707 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24666 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 555, "pos_bol": 24664, "pos_cnum": 24707 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24774 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24777 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24780 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24782 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24784 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24786 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24788 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24790 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24779 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24793 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24797 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24799 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24779 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24799 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array0.get a] returns the only element in [a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24856 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24856 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24856 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24802 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 559, "pos_bol": 24800, "pos_cnum": 24856 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24770 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24799 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24770 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 558, "pos_bol": 24768, "pos_cnum": 24799 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24864 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24867 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24870 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24874 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24876 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24878 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24880 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24869 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24883 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24887 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24889 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24893 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24887 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24869 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24897 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array0.set a x v] stores the value [v] in [a]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24954 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24954 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24954 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 562, "pos_bol": 24898, "pos_cnum": 24954 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24860 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24897 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24860 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 561, "pos_bol": 24858, "pos_cnum": 24897 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24967 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24971 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24974 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24976 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24978 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24980 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24982 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24984 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24973 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24987 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24992 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24994 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24996 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24998 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25000 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25002 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24991 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25005 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25009 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24991 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24973 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25013 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_blit" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Copy the first Bigarray to the second Bigarray.\n See {!Genarray.blit} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 565, "pos_bol": 25031, "pos_cnum": 25033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 566, "pos_bol": 25085, "pos_cnum": 25131 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 565, "pos_bol": 25031, "pos_cnum": 25033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 566, "pos_bol": 25085, "pos_cnum": 25131 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 565, "pos_bol": 25031, "pos_cnum": 25033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 566, "pos_bol": 25085, "pos_cnum": 25131 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 565, "pos_bol": 25031, "pos_cnum": 25033 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 566, "pos_bol": 25085, "pos_cnum": 25131 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24958 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25030 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 24958 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 564, "pos_bol": 24956, "pos_cnum": 25030 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25144 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25148 }, "loc_ghost": false }, "txt2": "fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25151 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25153 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25155 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25157 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25159 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25161 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25150 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25164 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25168 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25170 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25178 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25168 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25178 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25150 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25178 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_fill" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Fill the given Bigarray with the given value.\n See {!Genarray.fill} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 569, "pos_bol": 25196, "pos_cnum": 25198 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 570, "pos_bol": 25248, "pos_cnum": 25294 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 569, "pos_bol": 25196, "pos_cnum": 25198 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 570, "pos_bol": 25248, "pos_cnum": 25294 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 569, "pos_bol": 25196, "pos_cnum": 25198 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 570, "pos_bol": 25248, "pos_cnum": 25294 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 569, "pos_bol": 25196, "pos_cnum": 25198 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 570, "pos_bol": 25248, "pos_cnum": 25294 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25135 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25195 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25135 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 568, "pos_bol": 25133, "pos_cnum": 25195 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25310 }, "loc_ghost": false }, "txt2": "of_value" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25313 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25315 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25317 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25319 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25312 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25325 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25331 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25338 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25342 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25344 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25349 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25351 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25353 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25355 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25357 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25348 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25362 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25342 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25362 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25362 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25312 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25362 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Build a zero-dimensional Bigarray initialized from the\n given value. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 573, "pos_bol": 25363, "pos_cnum": 25365 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 574, "pos_bol": 25424, "pos_cnum": 25445 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 573, "pos_bol": 25363, "pos_cnum": 25365 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 574, "pos_bol": 25424, "pos_cnum": 25445 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 573, "pos_bol": 25363, "pos_cnum": 25365 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 574, "pos_bol": 25424, "pos_cnum": 25445 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 573, "pos_bol": 25363, "pos_cnum": 25365 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 574, "pos_bol": 25424, "pos_cnum": 25445 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25362 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 572, "pos_bol": 25296, "pos_cnum": 25362 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 524, "pos_bol": 23425, "pos_cnum": 23441 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 576, "pos_bol": 25447, "pos_cnum": 25450 }, "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", " Zero-dimensional arrays. The [Array0] structure provides operations\n similar to those of {!Bigarray.Genarray}, but specialized to the case\n of zero-dimensional arrays that only contain a single scalar value.\n Statically knowing the number of dimensions of the array allows\n faster operations, and more precise static type-checking.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 518, "pos_bol": 23063, "pos_cnum": 23063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 523, "pos_bol": 23407, "pos_cnum": 23424 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 518, "pos_bol": 23063, "pos_cnum": 23063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 523, "pos_bol": 23407, "pos_cnum": 23424 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 518, "pos_bol": 23063, "pos_cnum": 23063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 523, "pos_bol": 23407, "pos_cnum": 23424 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 518, "pos_bol": 23063, "pos_cnum": 23063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 523, "pos_bol": 23407, "pos_cnum": 23424 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 524, "pos_bol": 23425, "pos_cnum": 23425 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 576, "pos_bol": 25447, "pos_cnum": 25450 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 524, "pos_bol": 23425, "pos_cnum": 23425 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 576, "pos_bol": 25447, "pos_cnum": 25450 }, "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 One-dimensional arrays} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25453 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25486 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25453 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25486 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25453 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25486 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25453 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25486 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25453 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 579, "pos_bol": 25453, "pos_cnum": 25486 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 588, "pos_bol": 25916, "pos_cnum": 25923 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 588, "pos_bol": 25916, "pos_cnum": 25929 }, "loc_ghost": false }, "txt2": "Array1" }, "pmd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25959 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25960 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25945 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25947 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25950 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25955 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25957 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The type of one-dimensional Bigarrays whose elements have\n OCaml type ['a], representation kind ['b], and memory layout ['c]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 590, "pos_bol": 25961, "pos_cnum": 25963 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 591, "pos_bol": 26025, "pos_cnum": 26099 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 590, "pos_bol": 25961, "pos_cnum": 25963 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 591, "pos_bol": 26025, "pos_cnum": 26099 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 590, "pos_bol": 25961, "pos_cnum": 25963 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 591, "pos_bol": 26025, "pos_cnum": 26099 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 590, "pos_bol": 25961, "pos_cnum": 25963 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 591, "pos_bol": 26025, "pos_cnum": 26099 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25938 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25960 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25938 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 589, "pos_bol": 25936, "pos_cnum": 25960 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26107 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26113 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26116 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26118 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26120 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26122 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26115 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26128 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26132 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26134 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26132 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26141 }, "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/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26145 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26148 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26155 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26157 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26159 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26161 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26163 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26152 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26145 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26132 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26115 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array1.create kind layout dim] returns a new Bigarray of\n one dimension, whose size is [dim]. [kind] and [layout]\n determine the array element kind and the array layout\n as described for {!Genarray.create}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 594, "pos_bol": 26167, "pos_cnum": 26169 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 597, "pos_bol": 26352, "pos_cnum": 26396 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 594, "pos_bol": 26167, "pos_cnum": 26169 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 597, "pos_bol": 26352, "pos_cnum": 26396 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 594, "pos_bol": 26167, "pos_cnum": 26169 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 597, "pos_bol": 26352, "pos_cnum": 26396 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 594, "pos_bol": 26167, "pos_cnum": 26169 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 597, "pos_bol": 26352, "pos_cnum": 26396 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26103 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26166 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26103 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 593, "pos_bol": 26101, "pos_cnum": 26166 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26404 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26408 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26411 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26413 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26415 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26417 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26427 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26429 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26427 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26436 }, "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/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26440 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26443 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26448 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26451 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26455 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26448 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26457 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26475 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26477 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26479 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26481 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26483 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26485 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26474 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26447 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26440 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26427 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array1.init kind layout dim f] returns a new Bigarray [b]\n of one dimension, whose size is [dim]. [kind] and [layout]\n determine the array element kind and the array layout\n as described for {!Genarray.create}.\n\n Each element [Array1.get b i] of the array is initialized to the\n result of [f i].\n\n In other words, [Array1.init kind layout dimensions f] tabulates\n the results of [f] applied to the indices of a new Bigarray whose\n layout is described by [kind], [layout] and [dim].\n\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 601, "pos_bol": 26489, "pos_cnum": 26491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 613, "pos_bol": 27012, "pos_cnum": 27031 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 601, "pos_bol": 26489, "pos_cnum": 26491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 613, "pos_bol": 27012, "pos_cnum": 27031 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 601, "pos_bol": 26489, "pos_cnum": 26491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 613, "pos_bol": 27012, "pos_cnum": 27031 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 601, "pos_bol": 26489, "pos_cnum": 26491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 613, "pos_bol": 27012, "pos_cnum": 27031 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 599, "pos_bol": 26398, "pos_cnum": 26400 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 600, "pos_bol": 26462, "pos_cnum": 26488 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27044 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27047 }, "loc_ghost": false }, "txt2": "dim" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27050 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27052 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27054 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27056 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27058 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27060 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27049 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27063 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27067 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27070 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27049 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27070 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_dim_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 size (dimension) of the given one-dimensional\n Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 616, "pos_bol": 27090, "pos_cnum": 27092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 617, "pos_bol": 27153, "pos_cnum": 27170 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 616, "pos_bol": 27090, "pos_cnum": 27092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 617, "pos_bol": 27153, "pos_cnum": 27170 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 616, "pos_bol": 27090, "pos_cnum": 27092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 617, "pos_bol": 27153, "pos_cnum": 27170 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 616, "pos_bol": 27090, "pos_cnum": 27092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 617, "pos_bol": 27153, "pos_cnum": 27170 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27035 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27089 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27035 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 615, "pos_bol": 27033, "pos_cnum": 27089 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27183 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27187 }, "loc_ghost": false }, "txt2": "kind" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27190 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27192 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27194 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27196 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27198 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27200 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27189 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27203 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27208 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27210 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27212 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27214 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27207 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27220 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27189 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27220 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_kind" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 kind of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27285 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27285 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27285 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 620, "pos_bol": 27238, "pos_cnum": 27285 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27237 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 619, "pos_bol": 27172, "pos_cnum": 27237 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27298 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27304 }, "loc_ghost": false }, "txt2": "layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27307 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27309 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27311 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27313 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27315 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27317 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27306 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27320 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27324 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27326 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27324 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27333 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27306 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27333 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_layout" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 layout of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27402 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27402 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27402 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27355 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 623, "pos_bol": 27353, "pos_cnum": 27402 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27352 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 622, "pos_bol": 27287, "pos_cnum": 27352 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27423 }, "loc_ghost": false }, "txt2": "change_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27426 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27428 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27430 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27432 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27434 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27436 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27425 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27439 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27443 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27445 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27443 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27452 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27457 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27459 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27461 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27463 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27465 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27467 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27456 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27443 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27425 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27470 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array1.change_layout a layout] returns a Bigarray with the\n specified [layout], sharing the data with [a] (and hence having\n the same dimension as [a]). No copying of elements is involved: the\n new array and the original array share the same storage space.\n\n @since 4.06\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 626, "pos_bol": 27471, "pos_cnum": 27473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 632, "pos_bol": 27769, "pos_cnum": 27773 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 626, "pos_bol": 27471, "pos_cnum": 27473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 632, "pos_bol": 27769, "pos_cnum": 27773 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 626, "pos_bol": 27471, "pos_cnum": 27473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 632, "pos_bol": 27769, "pos_cnum": 27773 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 626, "pos_bol": 27471, "pos_cnum": 27473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 632, "pos_bol": 27769, "pos_cnum": 27773 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27406 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27470 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27406 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 625, "pos_bol": 27404, "pos_cnum": 27470 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27782 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27795 }, "loc_ghost": false }, "txt2": "size_in_bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27799 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27801 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27803 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27807 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27809 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27798 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27812 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27816 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27819 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27798 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27819 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [size_in_bytes a] is the number of elements in [a]\n multiplied by [a]'s {!kind_size_in_bytes}.\n\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 636, "pos_bol": 27820, "pos_cnum": 27822 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 639, "pos_bol": 27925, "pos_cnum": 27943 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 636, "pos_bol": 27820, "pos_cnum": 27822 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 639, "pos_bol": 27925, "pos_cnum": 27943 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 636, "pos_bol": 27820, "pos_cnum": 27822 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 639, "pos_bol": 27925, "pos_cnum": 27943 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 636, "pos_bol": 27820, "pos_cnum": 27822 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 639, "pos_bol": 27925, "pos_cnum": 27943 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27778 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27819 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27778 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 635, "pos_bol": 27776, "pos_cnum": 27819 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27956 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27959 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27962 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27964 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27966 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27968 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27970 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27972 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27961 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27975 }, "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/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27979 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27982 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27986 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27979 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27961 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_ref_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array1.get a x], or alternatively [a.{x}],\n returns the element of [a] at index [x].\n [x] must be greater or equal than [0] and strictly less than\n [Array1.dim a] if [a] has C layout. If [a] has Fortran layout,\n [x] must be greater or equal than [1] and less or equal than\n [Array1.dim a]. Otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 642, "pos_bol": 28008, "pos_cnum": 28010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 647, "pos_bol": 28305, "pos_cnum": 28370 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 642, "pos_bol": 28008, "pos_cnum": 28010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 647, "pos_bol": 28305, "pos_cnum": 28370 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 642, "pos_bol": 28008, "pos_cnum": 28010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 647, "pos_bol": 28305, "pos_cnum": 28370 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 642, "pos_bol": 28008, "pos_cnum": 28010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 647, "pos_bol": 28305, "pos_cnum": 28370 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27947 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 28007 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 27947 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 641, "pos_bol": 27945, "pos_cnum": 28007 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28383 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28386 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28389 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28391 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28393 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28395 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28397 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28399 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28388 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28402 }, "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/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28406 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28409 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28415 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28419 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28406 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28388 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28423 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_set_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array1.set a x v], also written [a.{x} <- v],\n stores the value [v] at index [x] in [a].\n [x] must be inside the bounds of [a] as described in\n {!Bigarray.Array1.get};\n otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 650, "pos_bol": 28443, "pos_cnum": 28445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 654, "pos_bol": 28630, "pos_cnum": 28678 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 650, "pos_bol": 28443, "pos_cnum": 28445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 654, "pos_bol": 28630, "pos_cnum": 28678 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 650, "pos_bol": 28443, "pos_cnum": 28445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 654, "pos_bol": 28630, "pos_cnum": 28678 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 650, "pos_bol": 28443, "pos_cnum": 28445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 654, "pos_bol": 28630, "pos_cnum": 28678 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28374 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28442 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28374 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 649, "pos_bol": 28372, "pos_cnum": 28442 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28691 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28694 }, "loc_ghost": false }, "txt2": "sub" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28697 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28699 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28701 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28703 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28705 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28707 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28696 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28710 }, "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/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28714 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28717 }, "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/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28721 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28724 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28729 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28731 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28733 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28735 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28737 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28739 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28728 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28721 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28714 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28696 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a sub-array of the given one-dimensional Bigarray.\n See {!Genarray.sub_left} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 658, "pos_bol": 28765, "pos_cnum": 28767 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 659, "pos_bol": 28830, "pos_cnum": 28880 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 658, "pos_bol": 28765, "pos_cnum": 28767 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 659, "pos_bol": 28830, "pos_cnum": 28880 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 658, "pos_bol": 28765, "pos_cnum": 28767 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 659, "pos_bol": 28830, "pos_cnum": 28880 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 658, "pos_bol": 28765, "pos_cnum": 28767 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 659, "pos_bol": 28830, "pos_cnum": 28880 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28682 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 657, "pos_bol": 28743, "pos_cnum": 28764 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 656, "pos_bol": 28680, "pos_cnum": 28682 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 657, "pos_bol": 28743, "pos_cnum": 28764 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28888 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28893 }, "loc_ghost": false }, "txt2": "slice" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28896 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28898 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28900 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28902 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28904 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28906 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28895 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28909 }, "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/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28913 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28916 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array0t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28921 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28923 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28925 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28927 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28929 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28931 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28920 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28941 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28913 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28941 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28895 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28941 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a scalar (zero-dimensional slice) of the given one-dimensional\n Bigarray. The integer parameter is the index of the scalar to\n extract. See {!Bigarray.Genarray.slice_left} and\n {!Bigarray.Genarray.slice_right} for more details.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 662, "pos_bol": 28942, "pos_cnum": 28944 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 666, "pos_bol": 29198, "pos_cnum": 29217 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 662, "pos_bol": 28942, "pos_cnum": 28944 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 666, "pos_bol": 29198, "pos_cnum": 29217 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 662, "pos_bol": 28942, "pos_cnum": 28944 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 666, "pos_bol": 29198, "pos_cnum": 29217 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 662, "pos_bol": 28942, "pos_cnum": 28944 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 666, "pos_bol": 29198, "pos_cnum": 29217 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28884 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28941 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28884 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 661, "pos_bol": 28882, "pos_cnum": 28941 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29230 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29234 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29237 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29239 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29241 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29243 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29245 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29247 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29236 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29250 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29255 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29257 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29259 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29261 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29263 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29265 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29254 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29268 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29272 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29254 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29236 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29276 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_blit" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Copy the first Bigarray to the second Bigarray.\n See {!Genarray.blit} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 670, "pos_bol": 29300, "pos_cnum": 29302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 671, "pos_bol": 29354, "pos_cnum": 29400 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 670, "pos_bol": 29300, "pos_cnum": 29302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 671, "pos_bol": 29354, "pos_cnum": 29400 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 670, "pos_bol": 29300, "pos_cnum": 29302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 671, "pos_bol": 29354, "pos_cnum": 29400 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 670, "pos_bol": 29300, "pos_cnum": 29302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 671, "pos_bol": 29354, "pos_cnum": 29400 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29221 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 669, "pos_bol": 29277, "pos_cnum": 29299 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 668, "pos_bol": 29219, "pos_cnum": 29221 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 669, "pos_bol": 29277, "pos_cnum": 29299 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29413 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29417 }, "loc_ghost": false }, "txt2": "fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29420 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29422 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29424 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29426 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29428 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29430 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29419 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29433 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29437 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29439 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29443 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29447 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29437 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29447 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29419 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29447 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_fill" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Fill the given Bigarray with the given value.\n See {!Genarray.fill} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 674, "pos_bol": 29465, "pos_cnum": 29467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 675, "pos_bol": 29517, "pos_cnum": 29563 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 674, "pos_bol": 29465, "pos_cnum": 29467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 675, "pos_bol": 29517, "pos_cnum": 29563 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 674, "pos_bol": 29465, "pos_cnum": 29467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 675, "pos_bol": 29517, "pos_cnum": 29563 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 674, "pos_bol": 29465, "pos_cnum": 29467 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 675, "pos_bol": 29517, "pos_cnum": 29563 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29404 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29464 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29404 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 673, "pos_bol": 29402, "pos_cnum": 29464 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29571 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29579 }, "loc_ghost": false }, "txt2": "of_array" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29582 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29584 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29586 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29588 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29581 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29594 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29598 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29600 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29598 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29607 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29611 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29613 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29611 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29619 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29624 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29626 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29628 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29630 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29634 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29623 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29637 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29611 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29637 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29598 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29637 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29581 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29637 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Build a one-dimensional Bigarray initialized from the\n given array. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 678, "pos_bol": 29638, "pos_cnum": 29640 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 679, "pos_bol": 29698, "pos_cnum": 29719 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 678, "pos_bol": 29638, "pos_cnum": 29640 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 679, "pos_bol": 29698, "pos_cnum": 29719 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 678, "pos_bol": 29638, "pos_cnum": 29640 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 679, "pos_bol": 29698, "pos_cnum": 29719 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 678, "pos_bol": 29638, "pos_cnum": 29640 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 679, "pos_bol": 29698, "pos_cnum": 29719 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29567 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29637 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29567 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 677, "pos_bol": 29565, "pos_cnum": 29637 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29732 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29742 }, "loc_ghost": false }, "txt2": "unsafe_get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29745 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29747 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29749 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29751 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29753 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29755 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29744 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29758 }, "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/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29762 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29769 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29762 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29744 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29771 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_unsafe_ref_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Like {!Bigarray.Array1.get}, but bounds checking is not always performed.\n Use with caution and only when the program logic guarantees that\n the access is within bounds. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 682, "pos_bol": 29798, "pos_cnum": 29800 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 684, "pos_bol": 29949, "pos_cnum": 29986 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 682, "pos_bol": 29798, "pos_cnum": 29800 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 684, "pos_bol": 29949, "pos_cnum": 29986 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 682, "pos_bol": 29798, "pos_cnum": 29800 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 684, "pos_bol": 29949, "pos_cnum": 29986 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 682, "pos_bol": 29798, "pos_cnum": 29800 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 684, "pos_bol": 29949, "pos_cnum": 29986 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29723 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29797 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29723 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 681, "pos_bol": 29721, "pos_cnum": 29797 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 29999 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30009 }, "loc_ghost": false }, "txt2": "unsafe_set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30012 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30014 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30016 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30018 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30020 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30022 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30011 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30025 }, "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/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30029 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30032 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30036 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30038 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30042 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30036 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30029 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30011 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 30046 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_unsafe_set_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Like {!Bigarray.Array1.set}, but bounds checking is not always performed.\n Use with caution and only when the program logic guarantees that\n the access is within bounds. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 688, "pos_bol": 30094, "pos_cnum": 30096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 690, "pos_bol": 30245, "pos_cnum": 30282 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 688, "pos_bol": 30094, "pos_cnum": 30096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 690, "pos_bol": 30245, "pos_cnum": 30282 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 688, "pos_bol": 30094, "pos_cnum": 30096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 690, "pos_bol": 30245, "pos_cnum": 30282 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 688, "pos_bol": 30094, "pos_cnum": 30096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 690, "pos_bol": 30245, "pos_cnum": 30282 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 29990 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 687, "pos_bol": 30047, "pos_cnum": 30093 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 686, "pos_bol": 29988, "pos_cnum": 29990 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 687, "pos_bol": 30047, "pos_cnum": 30093 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 588, "pos_bol": 25916, "pos_cnum": 25932 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 692, "pos_bol": 30284, "pos_cnum": 30287 }, "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", " One-dimensional arrays. The [Array1] structure provides operations\n similar to those of\n {!Bigarray.Genarray}, but specialized to the case of one-dimensional arrays.\n (The {!Array2} and {!Array3} structures below provide operations\n specialized for two- and three-dimensional arrays.)\n Statically knowing the number of dimensions of the array allows\n faster operations, and more precise static type-checking. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 581, "pos_bol": 25488, "pos_cnum": 25488 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 587, "pos_bol": 25852, "pos_cnum": 25915 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 581, "pos_bol": 25488, "pos_cnum": 25488 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 587, "pos_bol": 25852, "pos_cnum": 25915 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 581, "pos_bol": 25488, "pos_cnum": 25488 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 587, "pos_bol": 25852, "pos_cnum": 25915 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 581, "pos_bol": 25488, "pos_cnum": 25488 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 587, "pos_bol": 25852, "pos_cnum": 25915 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 588, "pos_bol": 25916, "pos_cnum": 25916 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 692, "pos_bol": 30284, "pos_cnum": 30287 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 588, "pos_bol": 25916, "pos_cnum": 25916 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 692, "pos_bol": 30284, "pos_cnum": 30287 }, "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 Two-dimensional arrays} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30290 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30323 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30290 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30323 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30290 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30323 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30290 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30323 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30290 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 695, "pos_bol": 30290, "pos_cnum": 30323 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 700, "pos_bol": 30502, "pos_cnum": 30509 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 700, "pos_bol": 30502, "pos_cnum": 30515 }, "loc_ghost": false }, "txt2": "Array2" }, "pmd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30547 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30548 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30533 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30535 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30538 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30540 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30543 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30545 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The type of two-dimensional Bigarrays whose elements have\n OCaml type ['a], representation kind ['b], and memory layout ['c]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 703, "pos_bol": 30549, "pos_cnum": 30551 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 704, "pos_bol": 30613, "pos_cnum": 30687 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 703, "pos_bol": 30549, "pos_cnum": 30551 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 704, "pos_bol": 30613, "pos_cnum": 30687 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 703, "pos_bol": 30549, "pos_cnum": 30551 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 704, "pos_bol": 30613, "pos_cnum": 30687 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 703, "pos_bol": 30549, "pos_cnum": 30551 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 704, "pos_bol": 30613, "pos_cnum": 30687 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30526 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30548 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30526 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 702, "pos_bol": 30524, "pos_cnum": 30548 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30695 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30701 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30704 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30708 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30710 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30703 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30716 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30721 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30723 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30721 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30730 }, "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/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30734 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30737 }, "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/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30741 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30744 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30749 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30751 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30753 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30755 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30757 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30759 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30748 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30741 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30734 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30721 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30703 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array2.create kind layout dim1 dim2] returns a new Bigarray of\n two dimensions, whose size is [dim1] in the first dimension\n and [dim2] in the second dimension. [kind] and [layout]\n determine the array element kind and the array layout\n as described for {!Bigarray.Genarray.create}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 707, "pos_bol": 30763, "pos_cnum": 30765 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 711, "pos_bol": 31019, "pos_cnum": 31072 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 707, "pos_bol": 30763, "pos_cnum": 30765 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 711, "pos_bol": 31019, "pos_cnum": 31072 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 707, "pos_bol": 30763, "pos_cnum": 30765 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 711, "pos_bol": 31019, "pos_cnum": 31072 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 707, "pos_bol": 30763, "pos_cnum": 30765 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 711, "pos_bol": 31019, "pos_cnum": 31072 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30691 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30691 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 706, "pos_bol": 30689, "pos_cnum": 30762 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31080 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31084 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31087 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31089 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31091 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31093 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31086 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31099 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31106 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31113 }, "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/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31117 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31120 }, "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/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31124 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31127 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31144 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31147 }, "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/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31151 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31154 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31158 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31160 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31151 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31160 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31144 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31160 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31166 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31168 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31170 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31172 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31174 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31165 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31143 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31124 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31117 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31086 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array2.init kind layout dim1 dim2 f] returns a new Bigarray [b]\n of two dimensions, whose size is [dim2] in the first dimension\n and [dim2] in the second dimension. [kind] and [layout]\n determine the array element kind and the array layout\n as described for {!Bigarray.Genarray.create}.\n\n Each element [Array2.get b i j] of the array is initialized to\n the result of [f i j].\n\n In other words, [Array2.init kind layout dim1 dim2 f] tabulates\n the results of [f] applied to the indices of a new Bigarray whose\n layout is described by [kind], [layout], [dim1] and [dim2].\n\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 715, "pos_bol": 31180, "pos_cnum": 31182 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 728, "pos_bol": 31795, "pos_cnum": 31814 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 715, "pos_bol": 31180, "pos_cnum": 31182 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 728, "pos_bol": 31795, "pos_cnum": 31814 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 715, "pos_bol": 31180, "pos_cnum": 31182 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 728, "pos_bol": 31795, "pos_cnum": 31814 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 715, "pos_bol": 31180, "pos_cnum": 31182 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 728, "pos_bol": 31795, "pos_cnum": 31814 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31076 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 713, "pos_bol": 31074, "pos_cnum": 31076 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 714, "pos_bol": 31131, "pos_cnum": 31179 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31827 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31831 }, "loc_ghost": false }, "txt2": "dim1" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31834 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31836 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31838 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31840 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31842 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31844 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31833 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31851 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31854 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31833 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31854 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_dim_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 first dimension of the given two-dimensional Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31876 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31948 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31876 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31948 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31876 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31948 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31876 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 731, "pos_bol": 31874, "pos_cnum": 31948 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31873 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 730, "pos_bol": 31816, "pos_cnum": 31873 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31961 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31965 }, "loc_ghost": false }, "txt2": "dim2" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31970 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31972 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31974 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31976 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31978 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31967 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31981 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31985 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31967 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31988 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_dim_2" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 second dimension of the given two-dimensional Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32083 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32083 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32083 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32010 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 734, "pos_bol": 32008, "pos_cnum": 32083 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31952 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 32007 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 31952 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 733, "pos_bol": 31950, "pos_cnum": 32007 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32096 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32100 }, "loc_ghost": false }, "txt2": "kind" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32103 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32105 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32107 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32109 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32111 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32113 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32102 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32116 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32121 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32123 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32125 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32127 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32120 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32133 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32102 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32133 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_kind" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 kind of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32198 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32198 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32198 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 737, "pos_bol": 32151, "pos_cnum": 32198 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32087 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32150 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32087 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 736, "pos_bol": 32085, "pos_cnum": 32150 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32211 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32217 }, "loc_ghost": false }, "txt2": "layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32220 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32222 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32224 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32226 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32228 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32230 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32219 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32233 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32237 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32239 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32237 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32219 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32246 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_layout" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 layout of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32315 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32315 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32315 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 740, "pos_bol": 32266, "pos_cnum": 32315 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32202 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32265 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32202 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 739, "pos_bol": 32200, "pos_cnum": 32265 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32323 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32336 }, "loc_ghost": false }, "txt2": "change_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32339 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32341 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32343 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32345 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32347 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32349 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32356 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32358 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32356 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32365 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32372 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32374 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32376 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32378 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32380 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32369 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32383 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32356 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32383 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32383 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array2.change_layout a layout] returns a Bigarray with the\n specified [layout], sharing the data with [a] (and hence having\n the same dimensions as [a]). No copying of elements is involved: the\n new array and the original array share the same storage space.\n The dimensions are reversed, such that [get v [| a; b |]] in\n C layout becomes [get v [| b+1; a+1 |]] in Fortran layout.\n\n @since 4.06\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 743, "pos_bol": 32384, "pos_cnum": 32386 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 751, "pos_bol": 32815, "pos_cnum": 32819 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 743, "pos_bol": 32384, "pos_cnum": 32386 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 751, "pos_bol": 32815, "pos_cnum": 32819 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 743, "pos_bol": 32384, "pos_cnum": 32386 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 751, "pos_bol": 32815, "pos_cnum": 32819 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 743, "pos_bol": 32384, "pos_cnum": 32386 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 751, "pos_bol": 32815, "pos_cnum": 32819 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32319 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32383 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32319 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 742, "pos_bol": 32317, "pos_cnum": 32383 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32828 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32841 }, "loc_ghost": false }, "txt2": "size_in_bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32845 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32847 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32849 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32851 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32853 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32855 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32844 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32858 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32862 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32865 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32844 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32865 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [size_in_bytes a] is the number of elements in [a]\n multiplied by [a]'s {!kind_size_in_bytes}.\n\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 755, "pos_bol": 32866, "pos_cnum": 32868 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 758, "pos_bol": 32971, "pos_cnum": 32989 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 755, "pos_bol": 32866, "pos_cnum": 32868 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 758, "pos_bol": 32971, "pos_cnum": 32989 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 755, "pos_bol": 32866, "pos_cnum": 32868 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 758, "pos_bol": 32971, "pos_cnum": 32989 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 755, "pos_bol": 32866, "pos_cnum": 32868 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 758, "pos_bol": 32971, "pos_cnum": 32989 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32824 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32865 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32824 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 754, "pos_bol": 32822, "pos_cnum": 32865 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33005 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33008 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33010 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33012 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33014 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33016 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33018 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33007 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33021 }, "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/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33025 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33028 }, "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/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33032 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33035 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33039 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33041 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33032 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33041 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33025 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33041 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33007 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33041 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_ref_2" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array2.get a x y], also written [a.{x,y}],\n returns the element of [a] at coordinates ([x], [y]).\n [x] and [y] must be within the bounds\n of [a], as described for {!Bigarray.Genarray.get};\n otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 761, "pos_bol": 33061, "pos_cnum": 33063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 765, "pos_bol": 33269, "pos_cnum": 33317 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 761, "pos_bol": 33061, "pos_cnum": 33063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 765, "pos_bol": 33269, "pos_cnum": 33317 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 761, "pos_bol": 33061, "pos_cnum": 33063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 765, "pos_bol": 33269, "pos_cnum": 33317 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 761, "pos_bol": 33061, "pos_cnum": 33063 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 765, "pos_bol": 33269, "pos_cnum": 33317 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 32993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33060 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 32993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 760, "pos_bol": 32991, "pos_cnum": 33060 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33333 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33336 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33338 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33340 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33342 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33346 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33335 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33349 }, "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/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33353 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33356 }, "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/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33360 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33363 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33367 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33369 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33373 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33367 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33360 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33353 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33335 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_set_2" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array2.set a x y v], or alternatively [a.{x,y} <- v],\n stores the value [v] at coordinates ([x], [y]) in [a].\n [x] and [y] must be within the bounds of [a],\n as described for {!Bigarray.Genarray.set};\n otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 768, "pos_bol": 33397, "pos_cnum": 33399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 772, "pos_bol": 33617, "pos_cnum": 33665 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 768, "pos_bol": 33397, "pos_cnum": 33399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 772, "pos_bol": 33617, "pos_cnum": 33665 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 768, "pos_bol": 33397, "pos_cnum": 33399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 772, "pos_bol": 33617, "pos_cnum": 33665 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 768, "pos_bol": 33397, "pos_cnum": 33399 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 772, "pos_bol": 33617, "pos_cnum": 33665 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33321 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33396 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33321 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 767, "pos_bol": 33319, "pos_cnum": 33396 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33678 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33686 }, "loc_ghost": false }, "txt2": "sub_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33689 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33691 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33693 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33695 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33697 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33705 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33688 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33708 }, "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/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33712 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33715 }, "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/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33719 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33722 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33727 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33729 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33731 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33733 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33735 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33743 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33726 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33719 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33712 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33688 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33746 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a two-dimensional sub-array of the given two-dimensional\n Bigarray by restricting the first dimension.\n See {!Bigarray.Genarray.sub_left} for more details.\n [Array2.sub_left] applies only to arrays with C layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 776, "pos_bol": 33767, "pos_cnum": 33769 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 779, "pos_bol": 33945, "pos_cnum": 34008 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 776, "pos_bol": 33767, "pos_cnum": 33769 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 779, "pos_bol": 33945, "pos_cnum": 34008 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 776, "pos_bol": 33767, "pos_cnum": 33769 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 779, "pos_bol": 33945, "pos_cnum": 34008 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 776, "pos_bol": 33767, "pos_cnum": 33769 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 779, "pos_bol": 33945, "pos_cnum": 34008 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33669 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 775, "pos_bol": 33747, "pos_cnum": 33766 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 774, "pos_bol": 33667, "pos_cnum": 33669 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 775, "pos_bol": 33747, "pos_cnum": 33766 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 781, "pos_bol": 34010, "pos_cnum": 34021 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 781, "pos_bol": 34010, "pos_cnum": 34030 }, "loc_ghost": false }, "txt2": "sub_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34037 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34039 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34041 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34043 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34045 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34059 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34036 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34062 }, "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/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34066 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34069 }, "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/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34073 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34076 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34081 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34085 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34087 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34089 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34080 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34106 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34073 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34106 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34066 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34106 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34036 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 782, "pos_bol": 34032, "pos_cnum": 34106 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a two-dimensional sub-array of the given two-dimensional\n Bigarray by restricting the second dimension.\n See {!Bigarray.Genarray.sub_right} for more details.\n [Array2.sub_right] applies only to arrays with Fortran layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 784, "pos_bol": 34127, "pos_cnum": 34129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 787, "pos_bol": 34307, "pos_cnum": 34377 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 784, "pos_bol": 34127, "pos_cnum": 34129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 787, "pos_bol": 34307, "pos_cnum": 34377 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 784, "pos_bol": 34127, "pos_cnum": 34129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 787, "pos_bol": 34307, "pos_cnum": 34377 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 784, "pos_bol": 34127, "pos_cnum": 34129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 787, "pos_bol": 34307, "pos_cnum": 34377 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 781, "pos_bol": 34010, "pos_cnum": 34012 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 783, "pos_bol": 34107, "pos_cnum": 34126 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 781, "pos_bol": 34010, "pos_cnum": 34012 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 783, "pos_bol": 34107, "pos_cnum": 34126 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34385 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34395 }, "loc_ghost": false }, "txt2": "slice_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34398 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34400 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34402 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34404 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34406 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34414 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34397 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34417 }, "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/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34421 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34424 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34429 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34431 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34433 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34435 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34437 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34445 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34428 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34455 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34421 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34455 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34397 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34455 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a row (one-dimensional slice) of the given two-dimensional\n Bigarray. The integer parameter is the index of the row to\n extract. See {!Bigarray.Genarray.slice_left} for more details.\n [Array2.slice_left] applies only to arrays with C layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 790, "pos_bol": 34456, "pos_cnum": 34458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 793, "pos_bol": 34663, "pos_cnum": 34728 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 790, "pos_bol": 34456, "pos_cnum": 34458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 793, "pos_bol": 34663, "pos_cnum": 34728 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 790, "pos_bol": 34456, "pos_cnum": 34458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 793, "pos_bol": 34663, "pos_cnum": 34728 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 790, "pos_bol": 34456, "pos_cnum": 34458 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 793, "pos_bol": 34663, "pos_cnum": 34728 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34455 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 789, "pos_bol": 34379, "pos_cnum": 34455 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 795, "pos_bol": 34730, "pos_cnum": 34736 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 795, "pos_bol": 34730, "pos_cnum": 34747 }, "loc_ghost": false }, "txt2": "slice_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34754 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34756 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34758 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34760 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34762 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34776 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34753 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34779 }, "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/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34783 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34786 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34791 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34793 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34795 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34797 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34799 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34813 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34790 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34823 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34783 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34823 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34753 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34823 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a column (one-dimensional slice) of the given\n two-dimensional Bigarray. The integer parameter is the\n index of the column to extract. See {!Bigarray.Genarray.slice_right}\n for more details. [Array2.slice_right] applies only to arrays\n with Fortran layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 797, "pos_bol": 34824, "pos_cnum": 34826 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 801, "pos_bol": 35088, "pos_cnum": 35116 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 797, "pos_bol": 34824, "pos_cnum": 34826 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 801, "pos_bol": 35088, "pos_cnum": 35116 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 797, "pos_bol": 34824, "pos_cnum": 34826 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 801, "pos_bol": 35088, "pos_cnum": 35116 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 797, "pos_bol": 34824, "pos_cnum": 34826 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 801, "pos_bol": 35088, "pos_cnum": 35116 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 795, "pos_bol": 34730, "pos_cnum": 34732 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34823 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 795, "pos_bol": 34730, "pos_cnum": 34732 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 796, "pos_bol": 34749, "pos_cnum": 34823 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35133 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35136 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35138 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35140 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35142 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35144 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35146 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35135 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35149 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35154 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35156 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35158 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35160 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35162 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35164 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35167 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35171 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35175 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35153 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35175 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35135 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35175 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_blit" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Copy the first Bigarray to the second Bigarray.\n See {!Bigarray.Genarray.blit} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 805, "pos_bol": 35197, "pos_cnum": 35199 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 806, "pos_bol": 35251, "pos_cnum": 35306 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 805, "pos_bol": 35197, "pos_cnum": 35199 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 806, "pos_bol": 35251, "pos_cnum": 35306 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 805, "pos_bol": 35197, "pos_cnum": 35199 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 806, "pos_bol": 35251, "pos_cnum": 35306 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 805, "pos_bol": 35197, "pos_cnum": 35199 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 806, "pos_bol": 35251, "pos_cnum": 35306 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35120 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 804, "pos_bol": 35176, "pos_cnum": 35196 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 803, "pos_bol": 35118, "pos_cnum": 35120 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 804, "pos_bol": 35176, "pos_cnum": 35196 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35319 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35323 }, "loc_ghost": false }, "txt2": "fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35326 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35328 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35332 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35334 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35336 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35339 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35343 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35345 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35349 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35343 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35353 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_fill" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Fill the given Bigarray with the given value.\n See {!Bigarray.Genarray.fill} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 809, "pos_bol": 35371, "pos_cnum": 35373 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 810, "pos_bol": 35423, "pos_cnum": 35478 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 809, "pos_bol": 35371, "pos_cnum": 35373 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 810, "pos_bol": 35423, "pos_cnum": 35478 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 809, "pos_bol": 35371, "pos_cnum": 35373 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 810, "pos_bol": 35423, "pos_cnum": 35478 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 809, "pos_bol": 35371, "pos_cnum": 35373 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 810, "pos_bol": 35423, "pos_cnum": 35478 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35310 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35370 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35310 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 808, "pos_bol": 35308, "pos_cnum": 35370 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35486 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35494 }, "loc_ghost": false }, "txt2": "of_array" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35497 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35499 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35501 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35503 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35496 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35509 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35513 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35515 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35513 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35522 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35526 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35528 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35526 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35534 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35526 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35540 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35545 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35547 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35549 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35551 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35553 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35555 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35558 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35526 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35558 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35513 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35558 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35496 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35558 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Build a two-dimensional Bigarray initialized from the\n given array of arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 813, "pos_bol": 35559, "pos_cnum": 35561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 814, "pos_bol": 35619, "pos_cnum": 35650 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 813, "pos_bol": 35559, "pos_cnum": 35561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 814, "pos_bol": 35619, "pos_cnum": 35650 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 813, "pos_bol": 35559, "pos_cnum": 35561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 814, "pos_bol": 35619, "pos_cnum": 35650 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 813, "pos_bol": 35559, "pos_cnum": 35561 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 814, "pos_bol": 35619, "pos_cnum": 35650 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35482 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35558 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35482 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 812, "pos_bol": 35480, "pos_cnum": 35558 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35663 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35673 }, "loc_ghost": false }, "txt2": "unsafe_get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35676 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35678 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35680 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35682 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35684 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35686 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35675 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35689 }, "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/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35693 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35696 }, "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/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35700 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35703 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35707 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35700 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35693 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35675 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35709 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_unsafe_ref_2" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Like {!Bigarray.Array2.get}, but bounds checking is not always\n performed. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 818, "pos_bol": 35757, "pos_cnum": 35759 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 819, "pos_bol": 35826, "pos_cnum": 35845 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 818, "pos_bol": 35757, "pos_cnum": 35759 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 819, "pos_bol": 35826, "pos_cnum": 35845 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 818, "pos_bol": 35757, "pos_cnum": 35759 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 819, "pos_bol": 35826, "pos_cnum": 35845 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 818, "pos_bol": 35757, "pos_cnum": 35759 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 819, "pos_bol": 35826, "pos_cnum": 35845 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35654 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 817, "pos_bol": 35710, "pos_cnum": 35756 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 816, "pos_bol": 35652, "pos_cnum": 35654 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 817, "pos_bol": 35710, "pos_cnum": 35756 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35858 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35868 }, "loc_ghost": false }, "txt2": "unsafe_set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35871 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35873 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35875 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35877 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35879 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35881 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35870 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35884 }, "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/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35888 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35891 }, "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/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35895 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35898 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35902 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35904 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35908 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35912 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35902 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35912 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35895 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35912 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35888 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35912 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35870 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35912 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_unsafe_set_2" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Like {!Bigarray.Array2.set}, but bounds checking is not always\n performed. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 823, "pos_bol": 35960, "pos_cnum": 35962 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 824, "pos_bol": 36029, "pos_cnum": 36048 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 823, "pos_bol": 35960, "pos_cnum": 35962 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 824, "pos_bol": 36029, "pos_cnum": 36048 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 823, "pos_bol": 35960, "pos_cnum": 35962 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 824, "pos_bol": 36029, "pos_cnum": 36048 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 823, "pos_bol": 35960, "pos_cnum": 35962 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 824, "pos_bol": 36029, "pos_cnum": 36048 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35849 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 822, "pos_bol": 35913, "pos_cnum": 35959 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 821, "pos_bol": 35847, "pos_cnum": 35849 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 822, "pos_bol": 35913, "pos_cnum": 35959 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 701, "pos_bol": 30518, "pos_cnum": 30520 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 826, "pos_bol": 36050, "pos_cnum": 36053 }, "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", " Two-dimensional arrays. The [Array2] structure provides operations\n similar to those of {!Bigarray.Genarray}, but specialized to the\n case of two-dimensional arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 697, "pos_bol": 30325, "pos_cnum": 30325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 699, "pos_bol": 30464, "pos_cnum": 30501 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 697, "pos_bol": 30325, "pos_cnum": 30325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 699, "pos_bol": 30464, "pos_cnum": 30501 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 697, "pos_bol": 30325, "pos_cnum": 30325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 699, "pos_bol": 30464, "pos_cnum": 30501 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 697, "pos_bol": 30325, "pos_cnum": 30325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 699, "pos_bol": 30464, "pos_cnum": 30501 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 700, "pos_bol": 30502, "pos_cnum": 30502 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 826, "pos_bol": 36050, "pos_cnum": 36053 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 700, "pos_bol": 30502, "pos_cnum": 30502 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 826, "pos_bol": 36050, "pos_cnum": 36053 }, "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 Three-dimensional arrays} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36090 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36090 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36090 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36090 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36055 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 828, "pos_bol": 36055, "pos_cnum": 36090 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_module", { "pmd_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 833, "pos_bol": 36273, "pos_cnum": 36280 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 833, "pos_bol": 36273, "pos_cnum": 36286 }, "loc_ghost": false }, "txt2": "Array3" }, "pmd_type": { "pmty_desc": [ "Pmty_signature", [ { "psig_desc": [ "Psig_type", [ "Recursive" ], [ { "ptype_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36318 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36319 }, "loc_ghost": false }, "txt2": "t" }, "ptype_params": [ [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36304 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36306 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36309 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36311 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ], [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36314 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36316 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, [ [ "NoVariance" ], [ "Injective" ] ] ] ], "ptype_cstrs": [], "ptype_kind": [ "Ptype_abstract" ], "ptype_private": [ "Public" ], "ptype_manifest": null, "ptype_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " The type of three-dimensional Bigarrays whose elements have\n OCaml type ['a], representation kind ['b], and memory layout ['c]. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 836, "pos_bol": 36320, "pos_cnum": 36322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 837, "pos_bol": 36386, "pos_cnum": 36460 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 836, "pos_bol": 36320, "pos_cnum": 36322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 837, "pos_bol": 36386, "pos_cnum": 36460 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 836, "pos_bol": 36320, "pos_cnum": 36322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 837, "pos_bol": 36386, "pos_cnum": 36460 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 836, "pos_bol": 36320, "pos_cnum": 36322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 837, "pos_bol": 36386, "pos_cnum": 36460 }, "loc_ghost": false } } ], "ptype_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36297 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36319 }, "loc_ghost": false } } ] ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36297 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 835, "pos_bol": 36295, "pos_cnum": 36319 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36468 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36474 }, "loc_ghost": false }, "txt2": "create" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36477 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36479 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36481 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36483 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36476 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36489 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36495 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36502 }, "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/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36506 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36509 }, "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/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36513 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36516 }, "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/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36520 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36528 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36530 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36532 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36534 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36536 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36538 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36527 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36520 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36513 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36506 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36493 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36476 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array3.create kind layout dim1 dim2 dim3] returns a new Bigarray of\n three dimensions, whose size is [dim1] in the first dimension,\n [dim2] in the second dimension, and [dim3] in the third.\n [kind] and [layout] determine the array element kind and\n the array layout as described for {!Bigarray.Genarray.create}. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 840, "pos_bol": 36542, "pos_cnum": 36544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 844, "pos_bol": 36809, "pos_cnum": 36879 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 840, "pos_bol": 36542, "pos_cnum": 36544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 844, "pos_bol": 36809, "pos_cnum": 36879 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 840, "pos_bol": 36542, "pos_cnum": 36544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 844, "pos_bol": 36809, "pos_cnum": 36879 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 840, "pos_bol": 36542, "pos_cnum": 36544 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 844, "pos_bol": 36809, "pos_cnum": 36879 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36464 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36464 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 839, "pos_bol": 36462, "pos_cnum": 36541 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36887 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36891 }, "loc_ghost": false }, "txt2": "init" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36894 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36896 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36898 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36900 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36893 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36906 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36911 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36913 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36911 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36920 }, "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/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36924 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36927 }, "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/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36931 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36934 }, "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/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36938 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36941 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36958 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36961 }, "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/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36965 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36968 }, "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/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36972 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36975 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36979 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36981 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36972 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36981 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36965 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36981 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36958 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36981 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36987 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36989 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36991 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36993 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36995 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36997 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36986 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 36957 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36938 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36931 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36924 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36911 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36893 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array3.init kind layout dim1 dim2 dim3 f] returns a new Bigarray [b]\n of three dimensions, whose size is [dim1] in the first dimension,\n [dim2] in the second dimension, and [dim3] in the third.\n [kind] and [layout] determine the array element kind and the array\n layout as described for {!Bigarray.Genarray.create}.\n\n Each element [Array3.get b i j k] of the array is initialized to\n the result of [f i j k].\n\n In other words, [Array3.init kind layout dim1 dim2 dim3 f] tabulates\n the results of [f] applied to the indices of a new Bigarray whose\n layout is described by [kind], [layout], [dim1], [dim2] and [dim3].\n\n @since 4.12 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 848, "pos_bol": 37001, "pos_cnum": 37003 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 861, "pos_bol": 37661, "pos_cnum": 37680 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 848, "pos_bol": 37001, "pos_cnum": 37003 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 861, "pos_bol": 37661, "pos_cnum": 37680 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 848, "pos_bol": 37001, "pos_cnum": 37003 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 861, "pos_bol": 37661, "pos_cnum": 37680 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 848, "pos_bol": 37001, "pos_cnum": 37003 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 861, "pos_bol": 37661, "pos_cnum": 37680 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36883 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 846, "pos_bol": 36881, "pos_cnum": 36883 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 847, "pos_bol": 36945, "pos_cnum": 37000 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37693 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37697 }, "loc_ghost": false }, "txt2": "dim1" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37700 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37702 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37704 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37706 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37708 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37710 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37699 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37713 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37717 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37720 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37699 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37720 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_dim_1" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 first dimension of the given three-dimensional Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37742 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37816 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37742 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37816 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37742 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37816 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37742 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 864, "pos_bol": 37740, "pos_cnum": 37816 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37684 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37739 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37684 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 863, "pos_bol": 37682, "pos_cnum": 37739 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37829 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37833 }, "loc_ghost": false }, "txt2": "dim2" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37836 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37838 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37840 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37842 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37844 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37846 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37835 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37849 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37853 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37856 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37835 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37856 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_dim_2" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 second dimension of the given three-dimensional Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37878 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37953 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37878 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37953 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37878 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37953 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37878 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 867, "pos_bol": 37876, "pos_cnum": 37953 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37820 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37875 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37820 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 866, "pos_bol": 37818, "pos_cnum": 37875 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37966 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37970 }, "loc_ghost": false }, "txt2": "dim3" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37973 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37975 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37977 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37979 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37981 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37983 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37972 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37986 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37990 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37993 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37972 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37993 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_dim_3" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 third dimension of the given three-dimensional Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38089 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38089 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38089 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 870, "pos_bol": 38013, "pos_cnum": 38089 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37957 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 38012 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 37957 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 869, "pos_bol": 37955, "pos_cnum": 38012 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38102 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38106 }, "loc_ghost": false }, "txt2": "kind" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38109 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38111 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38113 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38115 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38117 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38119 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38108 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38122 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38127 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38129 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38131 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38133 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38126 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38139 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38108 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38139 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_kind" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 kind of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38159 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38204 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38159 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38204 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38159 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38204 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38159 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 873, "pos_bol": 38157, "pos_cnum": 38204 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38093 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38156 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38093 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 872, "pos_bol": 38091, "pos_cnum": 38156 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38217 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38223 }, "loc_ghost": false }, "txt2": "layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38226 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38228 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38230 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38232 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38234 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38236 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38225 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38239 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38243 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38245 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38243 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38252 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38225 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38252 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_layout" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 layout of the given Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38321 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38321 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38321 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38274 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 876, "pos_bol": 38272, "pos_cnum": 38321 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38208 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38271 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38208 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 875, "pos_bol": 38206, "pos_cnum": 38271 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38343 }, "loc_ghost": false }, "txt2": "change_layout" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38346 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38348 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38350 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38352 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38354 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38356 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38345 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38359 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38363 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38365 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38363 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38372 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38379 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38383 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "d" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38385 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38387 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38376 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38390 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38363 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38390 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38345 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38390 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array3.change_layout a layout] returns a Bigarray with the\n specified [layout], sharing the data with [a] (and hence having\n the same dimensions as [a]). No copying of elements is involved: the\n new array and the original array share the same storage space.\n The dimensions are reversed, such that [get v [| a; b; c |]] in\n C layout becomes [get v [| c+1; b+1; a+1 |]] in Fortran layout.\n\n @since 4.06\n ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 880, "pos_bol": 38391, "pos_cnum": 38393 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 888, "pos_bol": 38830, "pos_cnum": 38834 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 880, "pos_bol": 38391, "pos_cnum": 38393 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 888, "pos_bol": 38830, "pos_cnum": 38834 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 880, "pos_bol": 38391, "pos_cnum": 38393 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 888, "pos_bol": 38830, "pos_cnum": 38834 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 880, "pos_bol": 38391, "pos_cnum": 38393 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 888, "pos_bol": 38830, "pos_cnum": 38834 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38326 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38390 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38326 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 879, "pos_bol": 38324, "pos_cnum": 38390 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38842 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38855 }, "loc_ghost": false }, "txt2": "size_in_bytes" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38859 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38861 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38863 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38865 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38867 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38869 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38858 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38872 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38876 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38879 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38858 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38879 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [size_in_bytes a] is the number of elements in [a]\n multiplied by [a]'s {!kind_size_in_bytes}.\n\n @since 4.03 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 891, "pos_bol": 38880, "pos_cnum": 38882 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 894, "pos_bol": 38985, "pos_cnum": 39003 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 891, "pos_bol": 38880, "pos_cnum": 38882 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 894, "pos_bol": 38985, "pos_cnum": 39003 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 891, "pos_bol": 38880, "pos_cnum": 38882 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 894, "pos_bol": 38985, "pos_cnum": 39003 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 891, "pos_bol": 38880, "pos_cnum": 38882 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 894, "pos_bol": 38985, "pos_cnum": 39003 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38838 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38879 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38838 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 890, "pos_bol": 38836, "pos_cnum": 38879 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39016 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39019 }, "loc_ghost": false }, "txt2": "get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39022 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39024 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39026 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39028 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39030 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39032 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39021 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39035 }, "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/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39039 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39042 }, "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/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39046 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39049 }, "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/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39053 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39056 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39060 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39053 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39046 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39039 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39021 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39062 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_ref_3" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array3.get a x y z], also written [a.{x,y,z}],\n returns the element of [a] at coordinates ([x], [y], [z]).\n [x], [y] and [z] must be within the bounds of [a],\n as described for {!Bigarray.Genarray.get};\n otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 897, "pos_bol": 39082, "pos_cnum": 39084 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 901, "pos_bol": 39304, "pos_cnum": 39352 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 897, "pos_bol": 39082, "pos_cnum": 39084 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 901, "pos_bol": 39304, "pos_cnum": 39352 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 897, "pos_bol": 39082, "pos_cnum": 39084 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 901, "pos_bol": 39304, "pos_cnum": 39352 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 897, "pos_bol": 39082, "pos_cnum": 39084 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 901, "pos_bol": 39304, "pos_cnum": 39352 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39007 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39081 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39007 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 896, "pos_bol": 39005, "pos_cnum": 39081 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39365 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39368 }, "loc_ghost": false }, "txt2": "set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39371 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39373 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39375 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39377 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39379 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39381 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39384 }, "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/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39388 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39391 }, "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/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39395 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39398 }, "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/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39402 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39405 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39409 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39411 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39415 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39409 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39402 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39395 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39388 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39370 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39419 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_set_3" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [Array3.set a x y v], or alternatively [a.{x,y,z} <- v],\n stores the value [v] at coordinates ([x], [y], [z]) in [a].\n [x], [y] and [z] must be within the bounds of [a],\n as described for {!Bigarray.Genarray.set};\n otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 905, "pos_bol": 39443, "pos_cnum": 39445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 909, "pos_bol": 39675, "pos_cnum": 39723 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 905, "pos_bol": 39443, "pos_cnum": 39445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 909, "pos_bol": 39675, "pos_cnum": 39723 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 905, "pos_bol": 39443, "pos_cnum": 39445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 909, "pos_bol": 39675, "pos_cnum": 39723 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 905, "pos_bol": 39443, "pos_cnum": 39445 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 909, "pos_bol": 39675, "pos_cnum": 39723 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39356 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 904, "pos_bol": 39420, "pos_cnum": 39442 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 903, "pos_bol": 39354, "pos_cnum": 39356 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 904, "pos_bol": 39420, "pos_cnum": 39442 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39736 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39744 }, "loc_ghost": false }, "txt2": "sub_left" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39747 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39749 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39751 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39753 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39755 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39763 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39766 }, "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/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39770 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39773 }, "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/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39777 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39780 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39785 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39787 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39789 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39791 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39793 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39801 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39784 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39777 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39770 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39746 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39804 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a three-dimensional sub-array of the given\n three-dimensional Bigarray by restricting the first dimension.\n See {!Bigarray.Genarray.sub_left} for more details. [Array3.sub_left]\n applies only to arrays with C layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 913, "pos_bol": 39825, "pos_cnum": 39827 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 916, "pos_bol": 40026, "pos_cnum": 40071 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 913, "pos_bol": 39825, "pos_cnum": 39827 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 916, "pos_bol": 40026, "pos_cnum": 40071 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 913, "pos_bol": 39825, "pos_cnum": 39827 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 916, "pos_bol": 40026, "pos_cnum": 40071 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 913, "pos_bol": 39825, "pos_cnum": 39827 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 916, "pos_bol": 40026, "pos_cnum": 40071 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39727 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 912, "pos_bol": 39805, "pos_cnum": 39824 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 911, "pos_bol": 39725, "pos_cnum": 39727 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 912, "pos_bol": 39805, "pos_cnum": 39824 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 918, "pos_bol": 40073, "pos_cnum": 40084 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 918, "pos_bol": 40073, "pos_cnum": 40093 }, "loc_ghost": false }, "txt2": "sub_right" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40100 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40102 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40106 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40108 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40122 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40099 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40125 }, "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/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40132 }, "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/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40136 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40139 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40144 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40146 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40148 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40150 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40152 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40143 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40136 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40129 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40099 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 919, "pos_bol": 40095, "pos_cnum": 40169 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_sub" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a three-dimensional sub-array of the given\n three-dimensional Bigarray by restricting the second dimension.\n See {!Bigarray.Genarray.sub_right} for more details. [Array3.sub_right]\n applies only to arrays with Fortran layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 921, "pos_bol": 40190, "pos_cnum": 40192 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 924, "pos_bol": 40394, "pos_cnum": 40445 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 921, "pos_bol": 40190, "pos_cnum": 40192 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 924, "pos_bol": 40394, "pos_cnum": 40445 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 921, "pos_bol": 40190, "pos_cnum": 40192 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 924, "pos_bol": 40394, "pos_cnum": 40445 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 921, "pos_bol": 40190, "pos_cnum": 40192 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 924, "pos_bol": 40394, "pos_cnum": 40445 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 918, "pos_bol": 40073, "pos_cnum": 40075 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 920, "pos_bol": 40170, "pos_cnum": 40189 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 918, "pos_bol": 40073, "pos_cnum": 40075 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 920, "pos_bol": 40170, "pos_cnum": 40189 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 926, "pos_bol": 40447, "pos_cnum": 40453 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 926, "pos_bol": 40447, "pos_cnum": 40465 }, "loc_ghost": false }, "txt2": "slice_left_1" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40474 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40476 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40478 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40480 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40488 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40471 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40491 }, "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/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40495 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40498 }, "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/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40502 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40505 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40510 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40512 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40514 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40516 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40518 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40526 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40509 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40536 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40502 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40536 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40495 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40536 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40471 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40536 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a one-dimensional slice of the given three-dimensional\n Bigarray by fixing the first two coordinates.\n The integer parameters are the coordinates of the slice to\n extract. See {!Bigarray.Genarray.slice_left} for more details.\n [Array3.slice_left_1] applies only to arrays with C layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 928, "pos_bol": 40537, "pos_cnum": 40539 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 932, "pos_bol": 40790, "pos_cnum": 40857 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 928, "pos_bol": 40537, "pos_cnum": 40539 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 932, "pos_bol": 40790, "pos_cnum": 40857 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 928, "pos_bol": 40537, "pos_cnum": 40539 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 932, "pos_bol": 40790, "pos_cnum": 40857 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 928, "pos_bol": 40537, "pos_cnum": 40539 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 932, "pos_bol": 40790, "pos_cnum": 40857 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 926, "pos_bol": 40447, "pos_cnum": 40449 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40536 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 926, "pos_bol": 40447, "pos_cnum": 40449 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 927, "pos_bol": 40467, "pos_cnum": 40536 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 934, "pos_bol": 40859, "pos_cnum": 40865 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 934, "pos_bol": 40859, "pos_cnum": 40878 }, "loc_ghost": false }, "txt2": "slice_right_1" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40885 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40887 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40889 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40891 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40893 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40907 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40884 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40910 }, "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/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40918 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40921 }, "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/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40925 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40928 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40933 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40935 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40937 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40939 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40941 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40955 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40932 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40965 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40925 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40965 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40918 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40965 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 935, "pos_bol": 40880, "pos_cnum": 40884 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40965 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a one-dimensional slice of the given three-dimensional\n Bigarray by fixing the last two coordinates.\n The integer parameters are the coordinates of the slice to\n extract. See {!Bigarray.Genarray.slice_right} for more details.\n [Array3.slice_right_1] applies only to arrays with Fortran\n layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 937, "pos_bol": 40966, "pos_cnum": 40968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 942, "pos_bol": 41283, "pos_cnum": 41298 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 937, "pos_bol": 40966, "pos_cnum": 40968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 942, "pos_bol": 41283, "pos_cnum": 41298 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 937, "pos_bol": 40966, "pos_cnum": 40968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 942, "pos_bol": 41283, "pos_cnum": 41298 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 937, "pos_bol": 40966, "pos_cnum": 40968 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 942, "pos_bol": 41283, "pos_cnum": 41298 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 934, "pos_bol": 40859, "pos_cnum": 40861 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40965 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 934, "pos_bol": 40859, "pos_cnum": 40861 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 936, "pos_bol": 40914, "pos_cnum": 40965 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41306 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41318 }, "loc_ghost": false }, "txt2": "slice_left_2" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41321 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41323 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41325 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41327 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41337 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41320 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41340 }, "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/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41347 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array2t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41352 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41354 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41356 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41358 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "c_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41360 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41368 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41378 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41344 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41378 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41320 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41378 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a two-dimensional slice of the given three-dimensional\n Bigarray by fixing the first coordinate.\n The integer parameter is the first coordinate of the slice to\n extract. See {!Bigarray.Genarray.slice_left} for more details.\n [Array3.slice_left_2] applies only to arrays with C layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 945, "pos_bol": 41379, "pos_cnum": 41381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 949, "pos_bol": 41631, "pos_cnum": 41698 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 945, "pos_bol": 41379, "pos_cnum": 41381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 949, "pos_bol": 41631, "pos_cnum": 41698 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 945, "pos_bol": 41379, "pos_cnum": 41381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 949, "pos_bol": 41631, "pos_cnum": 41698 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 945, "pos_bol": 41379, "pos_cnum": 41381 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 949, "pos_bol": 41631, "pos_cnum": 41698 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41378 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41302 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 944, "pos_bol": 41300, "pos_cnum": 41378 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 951, "pos_bol": 41700, "pos_cnum": 41706 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 951, "pos_bol": 41700, "pos_cnum": 41719 }, "loc_ghost": false }, "txt2": "slice_right_2" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41726 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41728 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41730 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41732 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41734 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41748 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41725 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41751 }, "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/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41755 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41758 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array2t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41763 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41765 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41767 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41769 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "fortran_layout", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41771 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41785 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41762 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41795 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41755 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41795 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41725 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41795 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Extract a two-dimensional slice of the given\n three-dimensional Bigarray by fixing the last coordinate.\n The integer parameter is the coordinate of the slice\n to extract. See {!Bigarray.Genarray.slice_right} for more details.\n [Array3.slice_right_2] applies only to arrays with Fortran\n layout. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 953, "pos_bol": 41796, "pos_cnum": 41798 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 958, "pos_bol": 42105, "pos_cnum": 42120 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 953, "pos_bol": 41796, "pos_cnum": 41798 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 958, "pos_bol": 42105, "pos_cnum": 42120 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 953, "pos_bol": 41796, "pos_cnum": 41798 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 958, "pos_bol": 42105, "pos_cnum": 42120 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 953, "pos_bol": 41796, "pos_cnum": 41798 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 958, "pos_bol": 42105, "pos_cnum": 42120 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 951, "pos_bol": 41700, "pos_cnum": 41702 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41795 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 951, "pos_bol": 41700, "pos_cnum": 41702 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 952, "pos_bol": 41721, "pos_cnum": 41795 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42133 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42137 }, "loc_ghost": false }, "txt2": "blit" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42140 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42142 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42144 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42146 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42148 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42150 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42139 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42153 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42158 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42160 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42162 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42164 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42166 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42168 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42157 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42171 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42175 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42157 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42139 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42179 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_blit" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Copy the first Bigarray to the second Bigarray.\n See {!Bigarray.Genarray.blit} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 962, "pos_bol": 42201, "pos_cnum": 42203 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 963, "pos_bol": 42255, "pos_cnum": 42310 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 962, "pos_bol": 42201, "pos_cnum": 42203 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 963, "pos_bol": 42255, "pos_cnum": 42310 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 962, "pos_bol": 42201, "pos_cnum": 42203 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 963, "pos_bol": 42255, "pos_cnum": 42310 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 962, "pos_bol": 42201, "pos_cnum": 42203 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 963, "pos_bol": 42255, "pos_cnum": 42310 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42124 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 961, "pos_bol": 42180, "pos_cnum": 42200 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 960, "pos_bol": 42122, "pos_cnum": 42124 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 961, "pos_bol": 42180, "pos_cnum": 42200 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42323 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42327 }, "loc_ghost": false }, "txt2": "fill" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42332 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42334 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42336 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42340 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42343 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42347 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42349 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42353 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42357 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42347 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42357 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42357 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "caml_ba_fill" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Fill the given Bigarray with the given value.\n See {!Bigarray.Genarray.fill} for more details. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 966, "pos_bol": 42375, "pos_cnum": 42377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 967, "pos_bol": 42427, "pos_cnum": 42482 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 966, "pos_bol": 42375, "pos_cnum": 42377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 967, "pos_bol": 42427, "pos_cnum": 42482 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 966, "pos_bol": 42375, "pos_cnum": 42377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 967, "pos_bol": 42427, "pos_cnum": 42482 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 966, "pos_bol": 42375, "pos_cnum": 42377 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 967, "pos_bol": 42427, "pos_cnum": 42482 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42314 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42374 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42314 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 965, "pos_bol": 42312, "pos_cnum": 42374 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 969, "pos_bol": 42484, "pos_cnum": 42490 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 969, "pos_bol": 42484, "pos_cnum": 42498 }, "loc_ghost": false }, "txt2": "of_array" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "kind", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42505 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42507 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42509 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42511 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42504 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42517 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "layout", [ { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42530 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42536 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42542 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42548 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42554 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42559 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42561 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42563 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42565 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42567 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42569 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42558 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42504 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42572 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Build a three-dimensional Bigarray initialized from the\n given array of arrays of arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 971, "pos_bol": 42573, "pos_cnum": 42575 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 972, "pos_bol": 42635, "pos_cnum": 42676 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 971, "pos_bol": 42573, "pos_cnum": 42575 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 972, "pos_bol": 42635, "pos_cnum": 42676 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 971, "pos_bol": 42573, "pos_cnum": 42575 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 972, "pos_bol": 42635, "pos_cnum": 42676 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 971, "pos_bol": 42573, "pos_cnum": 42575 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 972, "pos_bol": 42635, "pos_cnum": 42676 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 969, "pos_bol": 42484, "pos_cnum": 42486 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42572 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 969, "pos_bol": 42484, "pos_cnum": 42486 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 970, "pos_bol": 42500, "pos_cnum": 42572 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42689 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42699 }, "loc_ghost": false }, "txt2": "unsafe_get" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42702 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42704 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42706 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42708 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42710 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42712 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42701 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42715 }, "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/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42719 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42722 }, "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/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42726 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42729 }, "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/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42733 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42736 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42740 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42733 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42726 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42719 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42701 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42742 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_unsafe_ref_3" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Like {!Bigarray.Array3.get}, but bounds checking is not always\n performed. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 976, "pos_bol": 42790, "pos_cnum": 42792 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 977, "pos_bol": 42859, "pos_cnum": 42878 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 976, "pos_bol": 42790, "pos_cnum": 42792 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 977, "pos_bol": 42859, "pos_cnum": 42878 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 976, "pos_bol": 42790, "pos_cnum": 42792 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 977, "pos_bol": 42859, "pos_cnum": 42878 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 976, "pos_bol": 42790, "pos_cnum": 42792 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 977, "pos_bol": 42859, "pos_cnum": 42878 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42680 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 975, "pos_bol": 42743, "pos_cnum": 42789 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 974, "pos_bol": 42678, "pos_cnum": 42680 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 975, "pos_bol": 42743, "pos_cnum": 42789 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42891 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42901 }, "loc_ghost": false }, "txt2": "unsafe_set" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42904 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42906 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42908 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42910 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42912 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42914 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42903 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42917 }, "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/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42921 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42924 }, "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/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42928 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42931 }, "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/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42935 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42938 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42942 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42944 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "unit", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42948 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42942 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42935 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42928 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42921 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42903 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%caml_ba_unsafe_set_3" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Like {!Bigarray.Array3.set}, but bounds checking is not always\n performed. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 981, "pos_bol": 43000, "pos_cnum": 43002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 982, "pos_bol": 43069, "pos_cnum": 43088 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 981, "pos_bol": 43000, "pos_cnum": 43002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 982, "pos_bol": 43069, "pos_cnum": 43088 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 981, "pos_bol": 43000, "pos_cnum": 43002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 982, "pos_bol": 43069, "pos_cnum": 43088 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 981, "pos_bol": 43000, "pos_cnum": 43002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 982, "pos_bol": 43069, "pos_cnum": 43088 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42882 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 980, "pos_bol": 42953, "pos_cnum": 42999 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 979, "pos_bol": 42880, "pos_cnum": 42882 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 980, "pos_bol": 42953, "pos_cnum": 42999 }, "loc_ghost": false } } ] ], "pmty_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 834, "pos_bol": 36289, "pos_cnum": 36291 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 984, "pos_bol": 43090, "pos_cnum": 43093 }, "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", " Three-dimensional arrays. The [Array3] structure provides operations\n similar to those of {!Bigarray.Genarray}, but specialized to the case\n of three-dimensional arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 830, "pos_bol": 36092, "pos_cnum": 36092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 832, "pos_bol": 36238, "pos_cnum": 36272 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 830, "pos_bol": 36092, "pos_cnum": 36092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 832, "pos_bol": 36238, "pos_cnum": 36272 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 830, "pos_bol": 36092, "pos_cnum": 36092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 832, "pos_bol": 36238, "pos_cnum": 36272 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 830, "pos_bol": 36092, "pos_cnum": 36092 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 832, "pos_bol": 36238, "pos_cnum": 36272 }, "loc_ghost": false } } ], "pmd_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 833, "pos_bol": 36273, "pos_cnum": 36273 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 984, "pos_bol": 43090, "pos_cnum": 43093 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 833, "pos_bol": 36273, "pos_cnum": 36273 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 984, "pos_bol": 43090, "pos_cnum": 43093 }, "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 Coercions between generic Bigarrays and fixed-dimension Bigarrays} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43095 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43171 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43095 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43171 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43095 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43171 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43095 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43171 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43095 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 986, "pos_bol": 43095, "pos_cnum": 43171 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 988, "pos_bol": 43173, "pos_cnum": 43182 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 988, "pos_bol": 43173, "pos_cnum": 43200 }, "loc_ghost": false }, "txt2": "genarray_of_array0" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Array0t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43206 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43208 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43210 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43212 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43214 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43216 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43205 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43226 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43231 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43233 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43235 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43237 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43239 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43241 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43230 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43253 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43205 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43253 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%identity" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 generic Bigarray corresponding to the given zero-dimensional\n Bigarray.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 990, "pos_bol": 43268, "pos_cnum": 43268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 992, "pos_bol": 43358, "pos_cnum": 43376 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 990, "pos_bol": 43268, "pos_cnum": 43268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 992, "pos_bol": 43358, "pos_cnum": 43376 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 990, "pos_bol": 43268, "pos_cnum": 43268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 992, "pos_bol": 43358, "pos_cnum": 43376 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 990, "pos_bol": 43268, "pos_cnum": 43268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 992, "pos_bol": 43358, "pos_cnum": 43376 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 988, "pos_bol": 43173, "pos_cnum": 43173 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43267 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 988, "pos_bol": 43173, "pos_cnum": 43173 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 989, "pos_bol": 43203, "pos_cnum": 43267 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 994, "pos_bol": 43378, "pos_cnum": 43387 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 994, "pos_bol": 43378, "pos_cnum": 43405 }, "loc_ghost": false }, "txt2": "genarray_of_array1" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43411 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43413 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43415 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43417 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43419 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43421 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43431 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43436 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43438 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43440 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43442 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43444 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43446 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43435 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43458 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43410 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43458 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%identity" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 generic Bigarray corresponding to the given one-dimensional\n Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 996, "pos_bol": 43473, "pos_cnum": 43473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 997, "pos_bol": 43548, "pos_cnum": 43563 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 996, "pos_bol": 43473, "pos_cnum": 43473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 997, "pos_bol": 43548, "pos_cnum": 43563 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 996, "pos_bol": 43473, "pos_cnum": 43473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 997, "pos_bol": 43548, "pos_cnum": 43563 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 996, "pos_bol": 43473, "pos_cnum": 43473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 997, "pos_bol": 43548, "pos_cnum": 43563 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 994, "pos_bol": 43378, "pos_cnum": 43378 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43472 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 994, "pos_bol": 43378, "pos_cnum": 43378 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 995, "pos_bol": 43408, "pos_cnum": 43472 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 999, "pos_bol": 43565, "pos_cnum": 43574 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 999, "pos_bol": 43565, "pos_cnum": 43592 }, "loc_ghost": false }, "txt2": "genarray_of_array2" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Array2t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43598 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43600 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43602 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43604 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43606 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43608 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43597 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43618 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43623 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43625 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43627 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43629 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43631 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43633 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43622 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43645 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43597 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43645 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%identity" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 generic Bigarray corresponding to the given two-dimensional\n Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1001, "pos_bol": 43660, "pos_cnum": 43660 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1002, "pos_bol": 43735, "pos_cnum": 43750 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1001, "pos_bol": 43660, "pos_cnum": 43660 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1002, "pos_bol": 43735, "pos_cnum": 43750 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1001, "pos_bol": 43660, "pos_cnum": 43660 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1002, "pos_bol": 43735, "pos_cnum": 43750 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1001, "pos_bol": 43660, "pos_cnum": 43660 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1002, "pos_bol": 43735, "pos_cnum": 43750 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 999, "pos_bol": 43565, "pos_cnum": 43565 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43659 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 999, "pos_bol": 43565, "pos_cnum": 43565 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1000, "pos_bol": 43595, "pos_cnum": 43659 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1004, "pos_bol": 43752, "pos_cnum": 43761 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1004, "pos_bol": 43752, "pos_cnum": 43779 }, "loc_ghost": false }, "txt2": "genarray_of_array3" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Array3t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43785 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43787 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43789 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43791 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43793 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43795 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43784 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43805 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43810 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43812 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43814 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43816 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43818 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43820 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43809 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43832 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43784 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43832 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [ "%identity" ], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 generic Bigarray corresponding to the given three-dimensional\n Bigarray. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1006, "pos_bol": 43847, "pos_cnum": 43847 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1007, "pos_bol": 43924, "pos_cnum": 43939 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1006, "pos_bol": 43847, "pos_cnum": 43847 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1007, "pos_bol": 43924, "pos_cnum": 43939 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1006, "pos_bol": 43847, "pos_cnum": 43847 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1007, "pos_bol": 43924, "pos_cnum": 43939 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1006, "pos_bol": 43847, "pos_cnum": 43847 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1007, "pos_bol": 43924, "pos_cnum": 43939 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1004, "pos_bol": 43752, "pos_cnum": 43752 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43846 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1004, "pos_bol": 43752, "pos_cnum": 43752 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1005, "pos_bol": 43782, "pos_cnum": 43846 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43945 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43963 }, "loc_ghost": false }, "txt2": "array0_of_genarray" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43967 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43969 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43971 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43973 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43975 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43977 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43966 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43989 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array0t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43994 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43996 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43998 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44000 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44002 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44004 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44014 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43966 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44014 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 zero-dimensional Bigarray corresponding to the given\n generic Bigarray.\n @raise Invalid_argument if the generic Bigarray\n does not have exactly zero dimension.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1010, "pos_bol": 44015, "pos_cnum": 44015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1014, "pos_bol": 44196, "pos_cnum": 44213 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1010, "pos_bol": 44015, "pos_cnum": 44015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1014, "pos_bol": 44196, "pos_cnum": 44213 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1010, "pos_bol": 44015, "pos_cnum": 44015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1014, "pos_bol": 44196, "pos_cnum": 44213 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1010, "pos_bol": 44015, "pos_cnum": 44015 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1014, "pos_bol": 44196, "pos_cnum": 44213 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43941 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44014 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 43941 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1009, "pos_bol": 43941, "pos_cnum": 44014 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44219 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44237 }, "loc_ghost": false }, "txt2": "array1_of_genarray" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44241 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44243 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44245 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44247 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44249 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44251 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44263 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44268 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44270 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44272 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44274 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44276 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44278 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44267 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44288 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44240 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44288 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 one-dimensional Bigarray corresponding to the given\n generic Bigarray.\n @raise Invalid_argument if the generic Bigarray\n does not have exactly one dimension. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1017, "pos_bol": 44289, "pos_cnum": 44289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1020, "pos_bol": 44428, "pos_cnum": 44470 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1017, "pos_bol": 44289, "pos_cnum": 44289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1020, "pos_bol": 44428, "pos_cnum": 44470 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1017, "pos_bol": 44289, "pos_cnum": 44289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1020, "pos_bol": 44428, "pos_cnum": 44470 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1017, "pos_bol": 44289, "pos_cnum": 44289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1020, "pos_bol": 44428, "pos_cnum": 44470 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44215 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44288 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44215 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1016, "pos_bol": 44215, "pos_cnum": 44288 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44476 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44494 }, "loc_ghost": false }, "txt2": "array2_of_genarray" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44498 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44500 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44502 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44504 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44506 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44508 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44497 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44520 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array2t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44525 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44527 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44529 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44531 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44533 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44535 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44524 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44545 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44497 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44545 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 two-dimensional Bigarray corresponding to the given\n generic Bigarray.\n @raise Invalid_argument if the generic Bigarray\n does not have exactly two dimensions. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1023, "pos_bol": 44546, "pos_cnum": 44546 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1026, "pos_bol": 44685, "pos_cnum": 44728 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1023, "pos_bol": 44546, "pos_cnum": 44546 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1026, "pos_bol": 44685, "pos_cnum": 44728 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1023, "pos_bol": 44546, "pos_cnum": 44546 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1026, "pos_bol": 44685, "pos_cnum": 44728 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1023, "pos_bol": 44546, "pos_cnum": 44546 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1026, "pos_bol": 44685, "pos_cnum": 44728 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44545 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44472 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1022, "pos_bol": 44472, "pos_cnum": 44545 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44734 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44752 }, "loc_ghost": false }, "txt2": "array3_of_genarray" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44756 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44758 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44760 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44762 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44764 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44766 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44755 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44778 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array3t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44783 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44785 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44787 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44789 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44791 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44793 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44782 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44803 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44755 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44803 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_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 three-dimensional Bigarray corresponding to the given\n generic Bigarray.\n @raise Invalid_argument if the generic Bigarray\n does not have exactly three dimensions. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1029, "pos_bol": 44804, "pos_cnum": 44804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1032, "pos_bol": 44945, "pos_cnum": 44990 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1029, "pos_bol": 44804, "pos_cnum": 44804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1032, "pos_bol": 44945, "pos_cnum": 44990 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1029, "pos_bol": 44804, "pos_cnum": 44804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1032, "pos_bol": 44945, "pos_cnum": 44990 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1029, "pos_bol": 44804, "pos_cnum": 44804 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1032, "pos_bol": 44945, "pos_cnum": 44990 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44730 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44803 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44730 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1028, "pos_bol": 44730, "pos_cnum": 44803 }, "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 Re-shaping Bigarrays} ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 44993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 45024 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 44993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 45024 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 44993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 45024 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 44993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 45024 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 44993 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1035, "pos_bol": 44993, "pos_cnum": 45024 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45030 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45037 }, "loc_ghost": false }, "txt2": "reshape" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45041 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45043 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45045 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45047 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45049 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45051 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45040 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45063 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "array", [ { "ptyp_desc": [ "Ptyp_constr", "int", [] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45067 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45070 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45067 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45076 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45081 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45083 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45085 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45087 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45089 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45091 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45080 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45067 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45040 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45103 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " [reshape b [|d1;...;dN|]] converts the Bigarray [b] to a\n [N]-dimensional array of dimensions [d1]...[dN]. The returned\n array and the original array [b] share their data\n and have the same layout. For instance, assuming that [b]\n is a one-dimensional array of dimension 12, [reshape b [|3;4|]]\n returns a two-dimensional array [b'] of dimensions 3 and 4.\n If [b] has C layout, the element [(x,y)] of [b'] corresponds\n to the element [x * 3 + y] of [b]. If [b] has Fortran layout,\n the element [(x,y)] of [b'] corresponds to the element\n [x + (y - 1) * 4] of [b].\n The returned Bigarray must have exactly the same number of\n elements as the original Bigarray [b]. That is, the product\n of the dimensions of [b] must be equal to [i1 * ... * iN].\n Otherwise, [Invalid_argument] is raised. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1038, "pos_bol": 45104, "pos_cnum": 45104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1051, "pos_bol": 45881, "pos_cnum": 45927 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1038, "pos_bol": 45104, "pos_cnum": 45104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1051, "pos_bol": 45881, "pos_cnum": 45927 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1038, "pos_bol": 45104, "pos_cnum": 45104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1051, "pos_bol": 45881, "pos_cnum": 45927 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1038, "pos_bol": 45104, "pos_cnum": 45104 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1051, "pos_bol": 45881, "pos_cnum": 45927 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45026 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45103 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45026 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1037, "pos_bol": 45026, "pos_cnum": 45103 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45933 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45942 }, "loc_ghost": false }, "txt2": "reshape_0" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45946 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45948 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45950 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45952 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45954 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45956 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45945 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45968 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array0t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45973 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45975 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45977 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45979 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45981 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45983 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45972 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45993 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45945 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45993 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Specialized version of {!Bigarray.reshape} for reshaping to\n zero-dimensional arrays.\n @since 4.05 ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1054, "pos_bol": 45994, "pos_cnum": 45994 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1056, "pos_bol": 46086, "pos_cnum": 46103 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1054, "pos_bol": 45994, "pos_cnum": 45994 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1056, "pos_bol": 46086, "pos_cnum": 46103 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1054, "pos_bol": 45994, "pos_cnum": 45994 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1056, "pos_bol": 46086, "pos_cnum": 46103 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1054, "pos_bol": 45994, "pos_cnum": 45994 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1056, "pos_bol": 46086, "pos_cnum": 46103 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45929 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45993 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45929 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1053, "pos_bol": 45929, "pos_cnum": 45993 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46109 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46118 }, "loc_ghost": false }, "txt2": "reshape_1" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46122 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46124 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46126 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46128 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46130 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46132 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46121 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46144 }, "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/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46148 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46151 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array1t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46156 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46158 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46160 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46162 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46164 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46166 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46155 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46148 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46121 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46176 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Specialized version of {!Bigarray.reshape} for reshaping to\n one-dimensional arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1059, "pos_bol": 46177, "pos_cnum": 46177 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1060, "pos_bol": 46241, "pos_cnum": 46270 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1059, "pos_bol": 46177, "pos_cnum": 46177 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1060, "pos_bol": 46241, "pos_cnum": 46270 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1059, "pos_bol": 46177, "pos_cnum": 46177 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1060, "pos_bol": 46241, "pos_cnum": 46270 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1059, "pos_bol": 46177, "pos_cnum": 46177 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1060, "pos_bol": 46241, "pos_cnum": 46270 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46105 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46176 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46105 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1058, "pos_bol": 46105, "pos_cnum": 46176 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46276 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46285 }, "loc_ghost": false }, "txt2": "reshape_2" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46289 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46291 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46293 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46295 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46297 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46299 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46288 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46311 }, "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/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46315 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46318 }, "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/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46325 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array2t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46330 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46332 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46334 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46336 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46338 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46340 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46329 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46322 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46315 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46288 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46350 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Specialized version of {!Bigarray.reshape} for reshaping to\n two-dimensional arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1063, "pos_bol": 46351, "pos_cnum": 46351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1064, "pos_bol": 46415, "pos_cnum": 46444 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1063, "pos_bol": 46351, "pos_cnum": 46351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1064, "pos_bol": 46415, "pos_cnum": 46444 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1063, "pos_bol": 46351, "pos_cnum": 46351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1064, "pos_bol": 46415, "pos_cnum": 46444 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1063, "pos_bol": 46351, "pos_cnum": 46351 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1064, "pos_bol": 46415, "pos_cnum": 46444 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46272 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46350 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46272 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1062, "pos_bol": 46272, "pos_cnum": 46350 }, "loc_ghost": false } }, { "psig_desc": [ "Psig_value", { "pval_name": { "loc2": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1066, "pos_bol": 46446, "pos_cnum": 46450 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1066, "pos_bol": 46446, "pos_cnum": 46459 }, "loc_ghost": false }, "txt2": "reshape_3" }, "pval_type": { "ptyp_desc": [ "Ptyp_arrow", [ "Nolabel" ], { "ptyp_desc": [ "Ptyp_constr", "Genarrayt", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46465 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46467 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46469 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46471 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46473 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46475 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46464 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46487 }, "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/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46494 }, "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/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46498 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46501 }, "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/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46505 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46508 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_constr", "Array3t", [ { "ptyp_desc": [ "Ptyp_var", "a" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46513 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46515 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "b" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46517 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46519 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, { "ptyp_desc": [ "Ptyp_var", "c" ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46521 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46523 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ] ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46512 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46505 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46498 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46491 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] } ], "ptyp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46464 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "loc_ghost": false }, "ptyp_loc_stack": [], "ptyp_attributes": [] }, "pval_prim": [], "pval_attributes": [ { "attr_name": { "loc2": { "loc_start": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_end": { "pos_fname": "_none_", "pos_lnum": 0, "pos_bol": 0, "pos_cnum": -1 }, "loc_ghost": true }, "txt2": "ocaml.doc" }, "attr_payload": [ "PStr", [ { "pstr_desc": [ "Pstr_eval", { "pexp_desc": [ "Pexp_constant", [ "Pconst_string", " Specialized version of {!Bigarray.reshape} for reshaping to\n three-dimensional arrays. ", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1068, "pos_bol": 46534, "pos_cnum": 46534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1069, "pos_bol": 46598, "pos_cnum": 46630 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1068, "pos_bol": 46534, "pos_cnum": 46534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1069, "pos_bol": 46598, "pos_cnum": 46630 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1068, "pos_bol": 46534, "pos_cnum": 46534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1069, "pos_bol": 46598, "pos_cnum": 46630 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1068, "pos_bol": 46534, "pos_cnum": 46534 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1069, "pos_bol": 46598, "pos_cnum": 46630 }, "loc_ghost": false } } ], "pval_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1066, "pos_bol": 46446, "pos_cnum": 46446 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1066, "pos_bol": 46446, "pos_cnum": 46446 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1067, "pos_bol": 46462, "pos_cnum": 46533 }, "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:bigarray_concurrency Bigarrays and concurrency safety}\n\n Care must be taken when concurrently accessing bigarrays from multiple\n domains: accessing a bigarray will never crash a program, but unsynchronized\n accesses might yield surprising (non-sequentially-consistent) results.\n\n {2:bigarray_atomicity Atomicity}\n\n Every bigarray operation that accesses more than one array element is not\n atomic. This includes slicing, bliting, and filling bigarrays.\n\n For example, consider the following program:\n{[open Bigarray\nlet size = 100_000_000\nlet a = Array1.init Int C_layout size (fun _ -> 1)\nlet update f a () =\n for i = 0 to size - 1 do a.{i} <- f a.{i} done\nlet d1 = Domain.spawn (update (fun x -> x + 1) a)\nlet d2 = Domain.spawn (update (fun x -> 2 * x + 1) a)\nlet () = Domain.join d1; Domain.join d2\n]}\n\n After executing this code, each field of the bigarray [a] is either [2],\n [3], [4] or [5]. If atomicity is required, then the user must implement\n their own synchronization (for example, using {!Mutex.t}).\n\n {2:bigarray_data_race Data races}\n\n If two domains only access disjoint parts of the bigarray, then the\n observed behaviour is the equivalent to some sequential interleaving of the\n operations from the two domains.\n\n A data race is said to occur when two domains access the same bigarray\n element without synchronization and at least one of the accesses is a\n write. In the absence of data races, the observed behaviour is equivalent\n to some sequential interleaving of the operations from different domains.\n\n Whenever possible, data races should be avoided by using synchronization to\n mediate the accesses to the bigarray elements.\n\n Indeed, in the presence of data races, programs will not crash but the\n observed behaviour may not be equivalent to any sequential interleaving of\n operations from different domains.\n\n {2:bigarrarray_data_race_tearing Tearing}\n\n Bigarrays have a distinct caveat in the presence of data races:\n concurrent bigarray operations might produce surprising values due to\n tearing. More precisely, the interleaving of partial writes and reads might\n create values that would not exist with a sequential execution.\n For instance, at the end of\n{[let res = Array1.init Complex64 c_layout size (fun _ -> Complex.zero)\nlet d1 = Domain.spawn (fun () -> Array1.fill res Complex.one)\nlet d2 = Domain.spawn (fun () -> Array1.fill res Complex.i)\nlet () = Domain.join d1; Domain.join d2\n]}\n the [res] bigarray might contain values that are neither [Complex.i]\n nor [Complex.one] (for instance [1 + i]).\n", { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1071, "pos_bol": 46632, "pos_cnum": 46632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1129, "pos_bol": 49270, "pos_cnum": 49272 }, "loc_ghost": false }, null ] ], "pexp_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1071, "pos_bol": 46632, "pos_cnum": 46632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1129, "pos_bol": 49270, "pos_cnum": 49272 }, "loc_ghost": false }, "pexp_loc_stack": [], "pexp_attributes": [] }, [] ], "pstr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1071, "pos_bol": 46632, "pos_cnum": 46632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1129, "pos_bol": 49270, "pos_cnum": 49272 }, "loc_ghost": false } } ] ], "attr_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1071, "pos_bol": 46632, "pos_cnum": 46632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1129, "pos_bol": 49270, "pos_cnum": 49272 }, "loc_ghost": false } } ], "psig_loc": { "loc_start": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1071, "pos_bol": 46632, "pos_cnum": 46632 }, "loc_end": { "pos_fname": "./stdlib/bigarray.mli", "pos_lnum": 1129, "pos_bol": 49270, "pos_cnum": 49272 }, "loc_ghost": false } } ]