[
  {
    "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",
                      " Either type.\n\n    Either is the simplest and most generic sum/variant type:\n    a value of [('a, 'b) Either.t] is either a [Left (v : 'a)]\n    or a [Right (v : 'b)].\n\n    It is a natural choice in the API of generic functions where values\n    could fall in two different cases, possibly at different types,\n    without assigning a specific meaning to what each case should be.\n\n    For example:\n\n{[List.partition_map:\n    ('a -> ('b, 'c) Either.t) -> 'a list -> 'b list * 'c list]}\n\n    If you are looking for a parametrized type where\n    one alternative means success and the other means failure,\n    you should use the more specific type {!Result.t}.\n\n    @since 4.12\n",
                      {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 16,
                          "pos_bol": 1079,
                          "pos_cnum": 1079
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 36,
                          "pos_bol": 1754,
                          "pos_cnum": 1756
                        },
                        "loc_ghost": false
                      },
                      null
                    ]
                  ],
                  "pexp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 16,
                      "pos_bol": 1079,
                      "pos_cnum": 1079
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 36,
                      "pos_bol": 1754,
                      "pos_cnum": 1756
                    },
                    "loc_ghost": false
                  },
                  "pexp_loc_stack": [],
                  "pexp_attributes": []
                },
                []
              ],
              "pstr_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 16,
                  "pos_bol": 1079,
                  "pos_cnum": 1079
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 36,
                  "pos_bol": 1754,
                  "pos_cnum": 1756
                },
                "loc_ghost": false
              }
            }
          ]
        ],
        "attr_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 16,
            "pos_bol": 1079,
            "pos_cnum": 1079
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 36,
            "pos_bol": 1754,
            "pos_cnum": 1756
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 16,
        "pos_bol": 1079,
        "pos_cnum": 1079
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 36,
        "pos_bol": 1754,
        "pos_cnum": 1756
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_type",
      [ "Recursive" ],
      [
        {
          "ptype_name": {
            "loc2": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 56,
                "pos_bol": 2488,
                "pos_cnum": 2502
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 56,
                "pos_bol": 2488,
                "pos_cnum": 2503
              },
              "loc_ghost": false
            },
            "txt2": "t"
          },
          "ptype_params": [
            [
              {
                "ptyp_desc": [ "Ptyp_var", "a" ],
                "ptyp_loc": {
                  "loc_start": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2494
                  },
                  "loc_end": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2496
                  },
                  "loc_ghost": false
                },
                "ptyp_loc_stack": [],
                "ptyp_attributes": []
              },
              [ [ "NoVariance" ], [ "NoInjectivity" ] ]
            ],
            [
              {
                "ptyp_desc": [ "Ptyp_var", "b" ],
                "ptyp_loc": {
                  "loc_start": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2498
                  },
                  "loc_end": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2500
                  },
                  "loc_ghost": false
                },
                "ptyp_loc_stack": [],
                "ptyp_attributes": []
              },
              [ [ "NoVariance" ], [ "NoInjectivity" ] ]
            ]
          ],
          "ptype_cstrs": [],
          "ptype_kind": [
            "Ptype_variant",
            [
              {
                "pcd_name": {
                  "loc2": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 56,
                      "pos_bol": 2488,
                      "pos_cnum": 2506
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 56,
                      "pos_bol": 2488,
                      "pos_cnum": 2510
                    },
                    "loc_ghost": false
                  },
                  "txt2": "Left"
                },
                "pcd_vars": [],
                "pcd_args": [
                  "Pcstr_tuple",
                  [
                    {
                      "ptyp_desc": [ "Ptyp_var", "a" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 56,
                          "pos_bol": 2488,
                          "pos_cnum": 2514
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 56,
                          "pos_bol": 2488,
                          "pos_cnum": 2516
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ]
                ],
                "pcd_res": null,
                "pcd_loc": {
                  "loc_start": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2506
                  },
                  "loc_end": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2516
                  },
                  "loc_ghost": false
                },
                "pcd_attributes": []
              },
              {
                "pcd_name": {
                  "loc2": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 56,
                      "pos_bol": 2488,
                      "pos_cnum": 2519
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 56,
                      "pos_bol": 2488,
                      "pos_cnum": 2524
                    },
                    "loc_ghost": false
                  },
                  "txt2": "Right"
                },
                "pcd_vars": [],
                "pcd_args": [
                  "Pcstr_tuple",
                  [
                    {
                      "ptyp_desc": [ "Ptyp_var", "b" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 56,
                          "pos_bol": 2488,
                          "pos_cnum": 2528
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 56,
                          "pos_bol": 2488,
                          "pos_cnum": 2530
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ]
                ],
                "pcd_res": null,
                "pcd_loc": {
                  "loc_start": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2517
                  },
                  "loc_end": {
                    "pos_fname": "./stdlib/either.mli",
                    "pos_lnum": 56,
                    "pos_bol": 2488,
                    "pos_cnum": 2530
                  },
                  "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",
                            " A value of [('a, 'b) Either.t] contains\n    either a value of ['a]  or a value of ['b] ",
                            {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 57,
                                "pos_bol": 2536,
                                "pos_cnum": 2536
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 58,
                                "pos_bol": 2580,
                                "pos_cnum": 2629
                              },
                              "loc_ghost": false
                            },
                            null
                          ]
                        ],
                        "pexp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 57,
                            "pos_bol": 2536,
                            "pos_cnum": 2536
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 58,
                            "pos_bol": 2580,
                            "pos_cnum": 2629
                          },
                          "loc_ghost": false
                        },
                        "pexp_loc_stack": [],
                        "pexp_attributes": []
                      },
                      []
                    ],
                    "pstr_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 57,
                        "pos_bol": 2536,
                        "pos_cnum": 2536
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 58,
                        "pos_bol": 2580,
                        "pos_cnum": 2629
                      },
                      "loc_ghost": false
                    }
                  }
                ]
              ],
              "attr_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 57,
                  "pos_bol": 2536,
                  "pos_cnum": 2536
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 58,
                  "pos_bol": 2580,
                  "pos_cnum": 2629
                },
                "loc_ghost": false
              }
            }
          ],
          "ptype_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 56,
              "pos_bol": 2488,
              "pos_cnum": 2488
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 56,
              "pos_bol": 2488,
              "pos_cnum": 2530
            },
            "loc_ghost": false
          }
        }
      ]
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 56,
        "pos_bol": 2488,
        "pos_cnum": 2488
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 56,
        "pos_bol": 2488,
        "pos_cnum": 2530
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 60,
              "pos_bol": 2631,
              "pos_cnum": 2635
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 60,
              "pos_bol": 2631,
              "pos_cnum": 2639
            },
            "loc_ghost": false
          },
          "txt2": "left"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Nolabel" ],
            {
              "ptyp_desc": [ "Ptyp_var", "a" ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 60,
                  "pos_bol": 2631,
                  "pos_cnum": 2642
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 60,
                  "pos_bol": 2631,
                  "pos_cnum": 2644
                },
                "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/either.mli",
                        "pos_lnum": 60,
                        "pos_bol": 2631,
                        "pos_cnum": 2649
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 60,
                        "pos_bol": 2631,
                        "pos_cnum": 2651
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  },
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 60,
                        "pos_bol": 2631,
                        "pos_cnum": 2653
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 60,
                        "pos_bol": 2631,
                        "pos_cnum": 2655
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 60,
                  "pos_bol": 2631,
                  "pos_cnum": 2648
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 60,
                  "pos_bol": 2631,
                  "pos_cnum": 2658
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 60,
              "pos_bol": 2631,
              "pos_cnum": 2642
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 60,
              "pos_bol": 2631,
              "pos_cnum": 2658
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [left v] is [Left v]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 61,
                              "pos_bol": 2659,
                              "pos_cnum": 2659
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 61,
                              "pos_bol": 2659,
                              "pos_cnum": 2687
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 61,
                          "pos_bol": 2659,
                          "pos_cnum": 2659
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 61,
                          "pos_bol": 2659,
                          "pos_cnum": 2687
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 61,
                      "pos_bol": 2659,
                      "pos_cnum": 2659
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 61,
                      "pos_bol": 2659,
                      "pos_cnum": 2687
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 61,
                "pos_bol": 2659,
                "pos_cnum": 2659
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 61,
                "pos_bol": 2659,
                "pos_cnum": 2687
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 60,
            "pos_bol": 2631,
            "pos_cnum": 2631
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 60,
            "pos_bol": 2631,
            "pos_cnum": 2658
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 60,
        "pos_bol": 2631,
        "pos_cnum": 2631
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 60,
        "pos_bol": 2631,
        "pos_cnum": 2658
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 63,
              "pos_bol": 2689,
              "pos_cnum": 2693
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 63,
              "pos_bol": 2689,
              "pos_cnum": 2698
            },
            "loc_ghost": false
          },
          "txt2": "right"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Nolabel" ],
            {
              "ptyp_desc": [ "Ptyp_var", "b" ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 63,
                  "pos_bol": 2689,
                  "pos_cnum": 2701
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 63,
                  "pos_bol": 2689,
                  "pos_cnum": 2703
                },
                "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/either.mli",
                        "pos_lnum": 63,
                        "pos_bol": 2689,
                        "pos_cnum": 2708
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 63,
                        "pos_bol": 2689,
                        "pos_cnum": 2710
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  },
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 63,
                        "pos_bol": 2689,
                        "pos_cnum": 2712
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 63,
                        "pos_bol": 2689,
                        "pos_cnum": 2714
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 63,
                  "pos_bol": 2689,
                  "pos_cnum": 2707
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 63,
                  "pos_bol": 2689,
                  "pos_cnum": 2717
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 63,
              "pos_bol": 2689,
              "pos_cnum": 2701
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 63,
              "pos_bol": 2689,
              "pos_cnum": 2717
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [right v] is [Right v]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 64,
                              "pos_bol": 2718,
                              "pos_cnum": 2718
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 64,
                              "pos_bol": 2718,
                              "pos_cnum": 2748
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 64,
                          "pos_bol": 2718,
                          "pos_cnum": 2718
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 64,
                          "pos_bol": 2718,
                          "pos_cnum": 2748
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 64,
                      "pos_bol": 2718,
                      "pos_cnum": 2718
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 64,
                      "pos_bol": 2718,
                      "pos_cnum": 2748
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 64,
                "pos_bol": 2718,
                "pos_cnum": 2718
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 64,
                "pos_bol": 2718,
                "pos_cnum": 2748
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 63,
            "pos_bol": 2689,
            "pos_cnum": 2689
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 63,
            "pos_bol": 2689,
            "pos_cnum": 2717
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 63,
        "pos_bol": 2689,
        "pos_cnum": 2689
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 63,
        "pos_bol": 2689,
        "pos_cnum": 2717
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 66,
              "pos_bol": 2750,
              "pos_cnum": 2754
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 66,
              "pos_bol": 2750,
              "pos_cnum": 2761
            },
            "loc_ghost": false
          },
          "txt2": "is_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/either.mli",
                        "pos_lnum": 66,
                        "pos_bol": 2750,
                        "pos_cnum": 2765
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 66,
                        "pos_bol": 2750,
                        "pos_cnum": 2767
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  },
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 66,
                        "pos_bol": 2750,
                        "pos_cnum": 2769
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 66,
                        "pos_bol": 2750,
                        "pos_cnum": 2771
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 66,
                  "pos_bol": 2750,
                  "pos_cnum": 2764
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 66,
                  "pos_bol": 2750,
                  "pos_cnum": 2774
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 66,
                  "pos_bol": 2750,
                  "pos_cnum": 2778
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 66,
                  "pos_bol": 2750,
                  "pos_cnum": 2782
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 66,
              "pos_bol": 2750,
              "pos_cnum": 2764
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 66,
              "pos_bol": 2750,
              "pos_cnum": 2782
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [is_left (Left v)] is [true], [is_left (Right v)] is [false]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 67,
                              "pos_bol": 2783,
                              "pos_cnum": 2783
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 67,
                              "pos_bol": 2783,
                              "pos_cnum": 2851
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 67,
                          "pos_bol": 2783,
                          "pos_cnum": 2783
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 67,
                          "pos_bol": 2783,
                          "pos_cnum": 2851
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 67,
                      "pos_bol": 2783,
                      "pos_cnum": 2783
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 67,
                      "pos_bol": 2783,
                      "pos_cnum": 2851
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 67,
                "pos_bol": 2783,
                "pos_cnum": 2783
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 67,
                "pos_bol": 2783,
                "pos_cnum": 2851
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 66,
            "pos_bol": 2750,
            "pos_cnum": 2750
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 66,
            "pos_bol": 2750,
            "pos_cnum": 2782
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 66,
        "pos_bol": 2750,
        "pos_cnum": 2750
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 66,
        "pos_bol": 2750,
        "pos_cnum": 2782
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 69,
              "pos_bol": 2853,
              "pos_cnum": 2857
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 69,
              "pos_bol": 2853,
              "pos_cnum": 2865
            },
            "loc_ghost": false
          },
          "txt2": "is_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/either.mli",
                        "pos_lnum": 69,
                        "pos_bol": 2853,
                        "pos_cnum": 2869
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 69,
                        "pos_bol": 2853,
                        "pos_cnum": 2871
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  },
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 69,
                        "pos_bol": 2853,
                        "pos_cnum": 2873
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 69,
                        "pos_bol": 2853,
                        "pos_cnum": 2875
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 69,
                  "pos_bol": 2853,
                  "pos_cnum": 2868
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 69,
                  "pos_bol": 2853,
                  "pos_cnum": 2878
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 69,
                  "pos_bol": 2853,
                  "pos_cnum": 2882
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 69,
                  "pos_bol": 2853,
                  "pos_cnum": 2886
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 69,
              "pos_bol": 2853,
              "pos_cnum": 2868
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 69,
              "pos_bol": 2853,
              "pos_cnum": 2886
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [is_right (Left v)] is [false], [is_right (Right v)] is [true]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 70,
                              "pos_bol": 2887,
                              "pos_cnum": 2887
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 70,
                              "pos_bol": 2887,
                              "pos_cnum": 2957
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 70,
                          "pos_bol": 2887,
                          "pos_cnum": 2887
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 70,
                          "pos_bol": 2887,
                          "pos_cnum": 2957
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 70,
                      "pos_bol": 2887,
                      "pos_cnum": 2887
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 70,
                      "pos_bol": 2887,
                      "pos_cnum": 2957
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 70,
                "pos_bol": 2887,
                "pos_cnum": 2887
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 70,
                "pos_bol": 2887,
                "pos_cnum": 2957
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 69,
            "pos_bol": 2853,
            "pos_cnum": 2853
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 69,
            "pos_bol": 2853,
            "pos_cnum": 2886
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 69,
        "pos_bol": 2853,
        "pos_cnum": 2853
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 69,
        "pos_bol": 2853,
        "pos_cnum": 2886
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 72,
              "pos_bol": 2959,
              "pos_cnum": 2963
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 72,
              "pos_bol": 2959,
              "pos_cnum": 2972
            },
            "loc_ghost": false
          },
          "txt2": "find_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/either.mli",
                        "pos_lnum": 72,
                        "pos_bol": 2959,
                        "pos_cnum": 2976
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 72,
                        "pos_bol": 2959,
                        "pos_cnum": 2978
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  },
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 72,
                        "pos_bol": 2959,
                        "pos_cnum": 2980
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 72,
                        "pos_bol": 2959,
                        "pos_cnum": 2982
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 72,
                  "pos_bol": 2959,
                  "pos_cnum": 2975
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 72,
                  "pos_bol": 2959,
                  "pos_cnum": 2985
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_constr",
                "option",
                [
                  {
                    "ptyp_desc": [ "Ptyp_var", "a" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 72,
                        "pos_bol": 2959,
                        "pos_cnum": 2989
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 72,
                        "pos_bol": 2959,
                        "pos_cnum": 2991
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 72,
                  "pos_bol": 2959,
                  "pos_cnum": 2989
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 72,
                  "pos_bol": 2959,
                  "pos_cnum": 2998
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 72,
              "pos_bol": 2959,
              "pos_cnum": 2975
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 72,
              "pos_bol": 2959,
              "pos_cnum": 2998
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [find_left (Left v)] is [Some v], [find_left (Right _)] is [None] ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 73,
                              "pos_bol": 2999,
                              "pos_cnum": 2999
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 73,
                              "pos_bol": 2999,
                              "pos_cnum": 3071
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 73,
                          "pos_bol": 2999,
                          "pos_cnum": 2999
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 73,
                          "pos_bol": 2999,
                          "pos_cnum": 3071
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 73,
                      "pos_bol": 2999,
                      "pos_cnum": 2999
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 73,
                      "pos_bol": 2999,
                      "pos_cnum": 3071
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 73,
                "pos_bol": 2999,
                "pos_cnum": 2999
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 73,
                "pos_bol": 2999,
                "pos_cnum": 3071
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 72,
            "pos_bol": 2959,
            "pos_cnum": 2959
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 72,
            "pos_bol": 2959,
            "pos_cnum": 2998
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 72,
        "pos_bol": 2959,
        "pos_cnum": 2959
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 72,
        "pos_bol": 2959,
        "pos_cnum": 2998
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 75,
              "pos_bol": 3073,
              "pos_cnum": 3077
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 75,
              "pos_bol": 3073,
              "pos_cnum": 3087
            },
            "loc_ghost": false
          },
          "txt2": "find_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/either.mli",
                        "pos_lnum": 75,
                        "pos_bol": 3073,
                        "pos_cnum": 3091
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 75,
                        "pos_bol": 3073,
                        "pos_cnum": 3093
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  },
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 75,
                        "pos_bol": 3073,
                        "pos_cnum": 3095
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 75,
                        "pos_bol": 3073,
                        "pos_cnum": 3097
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 75,
                  "pos_bol": 3073,
                  "pos_cnum": 3090
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 75,
                  "pos_bol": 3073,
                  "pos_cnum": 3100
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_constr",
                "option",
                [
                  {
                    "ptyp_desc": [ "Ptyp_var", "b" ],
                    "ptyp_loc": {
                      "loc_start": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 75,
                        "pos_bol": 3073,
                        "pos_cnum": 3104
                      },
                      "loc_end": {
                        "pos_fname": "./stdlib/either.mli",
                        "pos_lnum": 75,
                        "pos_bol": 3073,
                        "pos_cnum": 3106
                      },
                      "loc_ghost": false
                    },
                    "ptyp_loc_stack": [],
                    "ptyp_attributes": []
                  }
                ]
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 75,
                  "pos_bol": 3073,
                  "pos_cnum": 3104
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 75,
                  "pos_bol": 3073,
                  "pos_cnum": 3113
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 75,
              "pos_bol": 3073,
              "pos_cnum": 3090
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 75,
              "pos_bol": 3073,
              "pos_cnum": 3113
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [find_right (Right v)] is [Some v], [find_right (Left _)] is [None] ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 76,
                              "pos_bol": 3114,
                              "pos_cnum": 3114
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 76,
                              "pos_bol": 3114,
                              "pos_cnum": 3188
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 76,
                          "pos_bol": 3114,
                          "pos_cnum": 3114
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 76,
                          "pos_bol": 3114,
                          "pos_cnum": 3188
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 76,
                      "pos_bol": 3114,
                      "pos_cnum": 3114
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 76,
                      "pos_bol": 3114,
                      "pos_cnum": 3188
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 76,
                "pos_bol": 3114,
                "pos_cnum": 3114
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 76,
                "pos_bol": 3114,
                "pos_cnum": 3188
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 75,
            "pos_bol": 3073,
            "pos_cnum": 3073
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 75,
            "pos_bol": 3073,
            "pos_cnum": 3113
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 75,
        "pos_bol": 3073,
        "pos_cnum": 3073
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 75,
        "pos_bol": 3073,
        "pos_cnum": 3113
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 78,
              "pos_bol": 3190,
              "pos_cnum": 3194
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 78,
              "pos_bol": 3190,
              "pos_cnum": 3202
            },
            "loc_ghost": false
          },
          "txt2": "map_left"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Nolabel" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a1" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3206
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3209
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [ "Ptyp_var", "a2" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3213
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3216
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 78,
                  "pos_bol": 3190,
                  "pos_cnum": 3206
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 78,
                  "pos_bol": 3190,
                  "pos_cnum": 3216
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [
                    "Ptyp_constr",
                    "t",
                    [
                      {
                        "ptyp_desc": [ "Ptyp_var", "a1" ],
                        "ptyp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3222
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3225
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      },
                      {
                        "ptyp_desc": [ "Ptyp_var", "b" ],
                        "ptyp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3227
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3229
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      }
                    ]
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3221
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3232
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [
                    "Ptyp_constr",
                    "t",
                    [
                      {
                        "ptyp_desc": [ "Ptyp_var", "a2" ],
                        "ptyp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3237
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3240
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      },
                      {
                        "ptyp_desc": [ "Ptyp_var", "b" ],
                        "ptyp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3242
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 78,
                            "pos_bol": 3190,
                            "pos_cnum": 3244
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      }
                    ]
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3236
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 78,
                      "pos_bol": 3190,
                      "pos_cnum": 3247
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 78,
                  "pos_bol": 3190,
                  "pos_cnum": 3221
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 78,
                  "pos_bol": 3190,
                  "pos_cnum": 3247
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 78,
              "pos_bol": 3190,
              "pos_cnum": 3205
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 78,
              "pos_bol": 3190,
              "pos_cnum": 3247
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [map_left f e] is [Left (f v)] if [e] is [Left v]\n    and [e] if [e] is [Right _]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 79,
                              "pos_bol": 3248,
                              "pos_cnum": 3248
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 80,
                              "pos_bol": 3302,
                              "pos_cnum": 3337
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 79,
                          "pos_bol": 3248,
                          "pos_cnum": 3248
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 80,
                          "pos_bol": 3302,
                          "pos_cnum": 3337
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 79,
                      "pos_bol": 3248,
                      "pos_cnum": 3248
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 80,
                      "pos_bol": 3302,
                      "pos_cnum": 3337
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 79,
                "pos_bol": 3248,
                "pos_cnum": 3248
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 80,
                "pos_bol": 3302,
                "pos_cnum": 3337
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 78,
            "pos_bol": 3190,
            "pos_cnum": 3190
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 78,
            "pos_bol": 3190,
            "pos_cnum": 3247
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 78,
        "pos_bol": 3190,
        "pos_cnum": 3190
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 78,
        "pos_bol": 3190,
        "pos_cnum": 3247
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 82,
              "pos_bol": 3339,
              "pos_cnum": 3343
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 82,
              "pos_bol": 3339,
              "pos_cnum": 3352
            },
            "loc_ghost": false
          },
          "txt2": "map_right"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Nolabel" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "b1" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3356
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3359
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [ "Ptyp_var", "b2" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3363
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3366
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 82,
                  "pos_bol": 3339,
                  "pos_cnum": 3356
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 82,
                  "pos_bol": 3339,
                  "pos_cnum": 3366
                },
                "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/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3372
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3374
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      },
                      {
                        "ptyp_desc": [ "Ptyp_var", "b1" ],
                        "ptyp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3376
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3379
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      }
                    ]
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3371
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3382
                    },
                    "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/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3387
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3389
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      },
                      {
                        "ptyp_desc": [ "Ptyp_var", "b2" ],
                        "ptyp_loc": {
                          "loc_start": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3391
                          },
                          "loc_end": {
                            "pos_fname": "./stdlib/either.mli",
                            "pos_lnum": 82,
                            "pos_bol": 3339,
                            "pos_cnum": 3394
                          },
                          "loc_ghost": false
                        },
                        "ptyp_loc_stack": [],
                        "ptyp_attributes": []
                      }
                    ]
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3386
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 82,
                      "pos_bol": 3339,
                      "pos_cnum": 3397
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 82,
                  "pos_bol": 3339,
                  "pos_cnum": 3371
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 82,
                  "pos_bol": 3339,
                  "pos_cnum": 3397
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 82,
              "pos_bol": 3339,
              "pos_cnum": 3355
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 82,
              "pos_bol": 3339,
              "pos_cnum": 3397
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [map_right f e] is [Right (f v)] if [e] is [Right v]\n    and [e] if [e] is [Left _]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 83,
                              "pos_bol": 3398,
                              "pos_cnum": 3398
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 84,
                              "pos_bol": 3455,
                              "pos_cnum": 3489
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 83,
                          "pos_bol": 3398,
                          "pos_cnum": 3398
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 84,
                          "pos_bol": 3455,
                          "pos_cnum": 3489
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 83,
                      "pos_bol": 3398,
                      "pos_cnum": 3398
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 84,
                      "pos_bol": 3455,
                      "pos_cnum": 3489
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 83,
                "pos_bol": 3398,
                "pos_cnum": 3398
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 84,
                "pos_bol": 3455,
                "pos_cnum": 3489
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 82,
            "pos_bol": 3339,
            "pos_cnum": 3339
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 82,
            "pos_bol": 3339,
            "pos_cnum": 3397
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 82,
        "pos_bol": 3339,
        "pos_cnum": 3339
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 82,
        "pos_bol": 3339,
        "pos_cnum": 3397
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 86,
              "pos_bol": 3491,
              "pos_cnum": 3495
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 86,
              "pos_bol": 3491,
              "pos_cnum": 3498
            },
            "loc_ghost": false
          },
          "txt2": "map"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Labelled", "left" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a1" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3509
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3512
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [ "Ptyp_var", "a2" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3516
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3519
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 87,
                  "pos_bol": 3501,
                  "pos_cnum": 3509
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 87,
                  "pos_bol": 3501,
                  "pos_cnum": 3519
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Labelled", "right" ],
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [ "Ptyp_var", "b1" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3531
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3534
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_var", "b2" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3538
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3541
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3531
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3541
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [
                        "Ptyp_constr",
                        "t",
                        [
                          {
                            "ptyp_desc": [ "Ptyp_var", "a1" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3547
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3550
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b1" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3552
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3555
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3546
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3558
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [
                        "Ptyp_constr",
                        "t",
                        [
                          {
                            "ptyp_desc": [ "Ptyp_var", "a2" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3563
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3566
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b2" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3568
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 87,
                                "pos_bol": 3501,
                                "pos_cnum": 3571
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3562
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 87,
                          "pos_bol": 3501,
                          "pos_cnum": 3574
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3546
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 87,
                      "pos_bol": 3501,
                      "pos_cnum": 3574
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 87,
                  "pos_bol": 3501,
                  "pos_cnum": 3524
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 87,
                  "pos_bol": 3501,
                  "pos_cnum": 3574
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 87,
              "pos_bol": 3501,
              "pos_cnum": 3503
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 87,
              "pos_bol": 3501,
              "pos_cnum": 3574
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [map ~left ~right (Left v)] is [Left (left v)],\n    [map ~left ~right (Right v)] is [Right (right v)]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 88,
                              "pos_bol": 3575,
                              "pos_cnum": 3575
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 89,
                              "pos_bol": 3627,
                              "pos_cnum": 3684
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 88,
                          "pos_bol": 3575,
                          "pos_cnum": 3575
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 89,
                          "pos_bol": 3627,
                          "pos_cnum": 3684
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 88,
                      "pos_bol": 3575,
                      "pos_cnum": 3575
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 89,
                      "pos_bol": 3627,
                      "pos_cnum": 3684
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 88,
                "pos_bol": 3575,
                "pos_cnum": 3575
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 89,
                "pos_bol": 3627,
                "pos_cnum": 3684
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 86,
            "pos_bol": 3491,
            "pos_cnum": 3491
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 87,
            "pos_bol": 3501,
            "pos_cnum": 3574
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 86,
        "pos_bol": 3491,
        "pos_cnum": 3491
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 87,
        "pos_bol": 3501,
        "pos_cnum": 3574
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 91,
              "pos_bol": 3686,
              "pos_cnum": 3690
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 91,
              "pos_bol": 3686,
              "pos_cnum": 3694
            },
            "loc_ghost": false
          },
          "txt2": "fold"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Labelled", "left" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3703
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3705
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [ "Ptyp_var", "c" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3709
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3711
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 91,
                  "pos_bol": 3686,
                  "pos_cnum": 3703
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 91,
                  "pos_bol": 3686,
                  "pos_cnum": 3711
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Labelled", "right" ],
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [ "Ptyp_var", "b" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3723
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3725
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_var", "c" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3729
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3731
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3723
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3731
                    },
                    "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/either.mli",
                                "pos_lnum": 91,
                                "pos_bol": 3686,
                                "pos_cnum": 3737
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 91,
                                "pos_bol": 3686,
                                "pos_cnum": 3739
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 91,
                                "pos_bol": 3686,
                                "pos_cnum": 3741
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 91,
                                "pos_bol": 3686,
                                "pos_cnum": 3743
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3736
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3746
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_var", "c" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3750
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 91,
                          "pos_bol": 3686,
                          "pos_cnum": 3752
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3736
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 91,
                      "pos_bol": 3686,
                      "pos_cnum": 3752
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 91,
                  "pos_bol": 3686,
                  "pos_cnum": 3716
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 91,
                  "pos_bol": 3686,
                  "pos_cnum": 3752
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 91,
              "pos_bol": 3686,
              "pos_cnum": 3697
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 91,
              "pos_bol": 3686,
              "pos_cnum": 3752
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [fold ~left ~right (Left v)] is [left v], and\n    [fold ~left ~right (Right v)] is [right v]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 92,
                              "pos_bol": 3753,
                              "pos_cnum": 3753
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 93,
                              "pos_bol": 3803,
                              "pos_cnum": 3853
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 92,
                          "pos_bol": 3753,
                          "pos_cnum": 3753
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 93,
                          "pos_bol": 3803,
                          "pos_cnum": 3853
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 92,
                      "pos_bol": 3753,
                      "pos_cnum": 3753
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 93,
                      "pos_bol": 3803,
                      "pos_cnum": 3853
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 92,
                "pos_bol": 3753,
                "pos_cnum": 3753
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 93,
                "pos_bol": 3803,
                "pos_cnum": 3853
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 91,
            "pos_bol": 3686,
            "pos_cnum": 3686
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 91,
            "pos_bol": 3686,
            "pos_cnum": 3752
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 91,
        "pos_bol": 3686,
        "pos_cnum": 3686
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 91,
        "pos_bol": 3686,
        "pos_cnum": 3752
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 95,
              "pos_bol": 3855,
              "pos_cnum": 3859
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 95,
              "pos_bol": 3855,
              "pos_cnum": 3863
            },
            "loc_ghost": false
          },
          "txt2": "iter"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Labelled", "left" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3872
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3874
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [ "Ptyp_constr", "unit", [] ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3878
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3882
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 95,
                  "pos_bol": 3855,
                  "pos_cnum": 3872
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 95,
                  "pos_bol": 3855,
                  "pos_cnum": 3882
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Labelled", "right" ],
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [ "Ptyp_var", "b" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3894
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3896
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_constr", "unit", [] ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3900
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3904
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3894
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3904
                    },
                    "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/either.mli",
                                "pos_lnum": 95,
                                "pos_bol": 3855,
                                "pos_cnum": 3910
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 95,
                                "pos_bol": 3855,
                                "pos_cnum": 3912
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 95,
                                "pos_bol": 3855,
                                "pos_cnum": 3914
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 95,
                                "pos_bol": 3855,
                                "pos_cnum": 3916
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3909
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3919
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_constr", "unit", [] ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3923
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 95,
                          "pos_bol": 3855,
                          "pos_cnum": 3927
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3909
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 95,
                      "pos_bol": 3855,
                      "pos_cnum": 3927
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 95,
                  "pos_bol": 3855,
                  "pos_cnum": 3887
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 95,
                  "pos_bol": 3855,
                  "pos_cnum": 3927
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 95,
              "pos_bol": 3855,
              "pos_cnum": 3866
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 95,
              "pos_bol": 3855,
              "pos_cnum": 3927
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [iter ~left ~right (Left v)] is [left v], and\n    [iter ~left ~right (Right v)] is [right v]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 96,
                              "pos_bol": 3928,
                              "pos_cnum": 3928
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 97,
                              "pos_bol": 3978,
                              "pos_cnum": 4028
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 96,
                          "pos_bol": 3928,
                          "pos_cnum": 3928
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 97,
                          "pos_bol": 3978,
                          "pos_cnum": 4028
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 96,
                      "pos_bol": 3928,
                      "pos_cnum": 3928
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 97,
                      "pos_bol": 3978,
                      "pos_cnum": 4028
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 96,
                "pos_bol": 3928,
                "pos_cnum": 3928
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 97,
                "pos_bol": 3978,
                "pos_cnum": 4028
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 95,
            "pos_bol": 3855,
            "pos_cnum": 3855
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 95,
            "pos_bol": 3855,
            "pos_cnum": 3927
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 95,
        "pos_bol": 3855,
        "pos_cnum": 3855
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 95,
        "pos_bol": 3855,
        "pos_cnum": 3927
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 99,
              "pos_bol": 4030,
              "pos_cnum": 4034
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 99,
              "pos_bol": 4030,
              "pos_cnum": 4041
            },
            "loc_ghost": false
          },
          "txt2": "for_all"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Labelled", "left" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4050
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4052
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                },
                {
                  "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4056
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4060
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 99,
                  "pos_bol": 4030,
                  "pos_cnum": 4050
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 99,
                  "pos_bol": 4030,
                  "pos_cnum": 4060
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Labelled", "right" ],
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [ "Ptyp_var", "b" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4072
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4074
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4078
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4082
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4072
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4082
                    },
                    "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/either.mli",
                                "pos_lnum": 99,
                                "pos_bol": 4030,
                                "pos_cnum": 4088
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 99,
                                "pos_bol": 4030,
                                "pos_cnum": 4090
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 99,
                                "pos_bol": 4030,
                                "pos_cnum": 4092
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 99,
                                "pos_bol": 4030,
                                "pos_cnum": 4094
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4087
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4097
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4101
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 99,
                          "pos_bol": 4030,
                          "pos_cnum": 4105
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4087
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 99,
                      "pos_bol": 4030,
                      "pos_cnum": 4105
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 99,
                  "pos_bol": 4030,
                  "pos_cnum": 4065
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 99,
                  "pos_bol": 4030,
                  "pos_cnum": 4105
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 99,
              "pos_bol": 4030,
              "pos_cnum": 4044
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 99,
              "pos_bol": 4030,
              "pos_cnum": 4105
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [for_all ~left ~right (Left v)] is [left v], and\n    [for_all ~left ~right (Right v)] is [right v]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 100,
                              "pos_bol": 4106,
                              "pos_cnum": 4106
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 101,
                              "pos_bol": 4159,
                              "pos_cnum": 4212
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 100,
                          "pos_bol": 4106,
                          "pos_cnum": 4106
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 101,
                          "pos_bol": 4159,
                          "pos_cnum": 4212
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 100,
                      "pos_bol": 4106,
                      "pos_cnum": 4106
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 101,
                      "pos_bol": 4159,
                      "pos_cnum": 4212
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 100,
                "pos_bol": 4106,
                "pos_cnum": 4106
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 101,
                "pos_bol": 4159,
                "pos_cnum": 4212
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 99,
            "pos_bol": 4030,
            "pos_cnum": 4030
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 99,
            "pos_bol": 4030,
            "pos_cnum": 4105
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 99,
        "pos_bol": 4030,
        "pos_cnum": 4030
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 99,
        "pos_bol": 4030,
        "pos_cnum": 4105
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 103,
              "pos_bol": 4214,
              "pos_cnum": 4218
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 103,
              "pos_bol": 4214,
              "pos_cnum": 4223
            },
            "loc_ghost": false
          },
          "txt2": "equal"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Labelled", "left" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 104,
                      "pos_bol": 4226,
                      "pos_cnum": 4234
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 104,
                      "pos_bol": 4226,
                      "pos_cnum": 4236
                    },
                    "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/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4240
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4242
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4246
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4250
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 104,
                      "pos_bol": 4226,
                      "pos_cnum": 4240
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 104,
                      "pos_bol": 4226,
                      "pos_cnum": 4250
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 104,
                  "pos_bol": 4226,
                  "pos_cnum": 4234
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 104,
                  "pos_bol": 4226,
                  "pos_cnum": 4250
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Labelled", "right" ],
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [ "Ptyp_var", "b" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4262
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4264
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [
                        "Ptyp_arrow",
                        [ "Nolabel" ],
                        {
                          "ptyp_desc": [ "Ptyp_var", "b" ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 104,
                              "pos_bol": 4226,
                              "pos_cnum": 4268
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 104,
                              "pos_bol": 4226,
                              "pos_cnum": 4270
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        },
                        {
                          "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 104,
                              "pos_bol": 4226,
                              "pos_cnum": 4274
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 104,
                              "pos_bol": 4226,
                              "pos_cnum": 4278
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        }
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4268
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 104,
                          "pos_bol": 4226,
                          "pos_cnum": 4278
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 104,
                      "pos_bol": 4226,
                      "pos_cnum": 4262
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 104,
                      "pos_bol": 4226,
                      "pos_cnum": 4278
                    },
                    "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/either.mli",
                                "pos_lnum": 105,
                                "pos_bol": 4283,
                                "pos_cnum": 4286
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 105,
                                "pos_bol": 4283,
                                "pos_cnum": 4288
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 105,
                                "pos_bol": 4283,
                                "pos_cnum": 4290
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 105,
                                "pos_bol": 4283,
                                "pos_cnum": 4292
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 105,
                          "pos_bol": 4283,
                          "pos_cnum": 4285
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 105,
                          "pos_bol": 4283,
                          "pos_cnum": 4295
                        },
                        "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/either.mli",
                                    "pos_lnum": 105,
                                    "pos_bol": 4283,
                                    "pos_cnum": 4300
                                  },
                                  "loc_end": {
                                    "pos_fname": "./stdlib/either.mli",
                                    "pos_lnum": 105,
                                    "pos_bol": 4283,
                                    "pos_cnum": 4302
                                  },
                                  "loc_ghost": false
                                },
                                "ptyp_loc_stack": [],
                                "ptyp_attributes": []
                              },
                              {
                                "ptyp_desc": [ "Ptyp_var", "b" ],
                                "ptyp_loc": {
                                  "loc_start": {
                                    "pos_fname": "./stdlib/either.mli",
                                    "pos_lnum": 105,
                                    "pos_bol": 4283,
                                    "pos_cnum": 4304
                                  },
                                  "loc_end": {
                                    "pos_fname": "./stdlib/either.mli",
                                    "pos_lnum": 105,
                                    "pos_bol": 4283,
                                    "pos_cnum": 4306
                                  },
                                  "loc_ghost": false
                                },
                                "ptyp_loc_stack": [],
                                "ptyp_attributes": []
                              }
                            ]
                          ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 105,
                              "pos_bol": 4283,
                              "pos_cnum": 4299
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 105,
                              "pos_bol": 4283,
                              "pos_cnum": 4309
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        },
                        {
                          "ptyp_desc": [ "Ptyp_constr", "bool", [] ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 105,
                              "pos_bol": 4283,
                              "pos_cnum": 4313
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 105,
                              "pos_bol": 4283,
                              "pos_cnum": 4317
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        }
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 105,
                          "pos_bol": 4283,
                          "pos_cnum": 4299
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 105,
                          "pos_bol": 4283,
                          "pos_cnum": 4317
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 105,
                      "pos_bol": 4283,
                      "pos_cnum": 4285
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 105,
                      "pos_bol": 4283,
                      "pos_cnum": 4317
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 104,
                  "pos_bol": 4226,
                  "pos_cnum": 4255
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 105,
                  "pos_bol": 4283,
                  "pos_cnum": 4317
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 104,
              "pos_bol": 4226,
              "pos_cnum": 4228
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 105,
              "pos_bol": 4283,
              "pos_cnum": 4317
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [equal ~left ~right e0 e1] tests equality of [e0] and [e1] using [left]\n    and [right] to respectively compare values wrapped by [Left _] and\n    [Right _]. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 106,
                              "pos_bol": 4318,
                              "pos_cnum": 4318
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 108,
                              "pos_bol": 4465,
                              "pos_cnum": 4482
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 106,
                          "pos_bol": 4318,
                          "pos_cnum": 4318
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 108,
                          "pos_bol": 4465,
                          "pos_cnum": 4482
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 106,
                      "pos_bol": 4318,
                      "pos_cnum": 4318
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 108,
                      "pos_bol": 4465,
                      "pos_cnum": 4482
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 106,
                "pos_bol": 4318,
                "pos_cnum": 4318
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 108,
                "pos_bol": 4465,
                "pos_cnum": 4482
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 103,
            "pos_bol": 4214,
            "pos_cnum": 4214
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 105,
            "pos_bol": 4283,
            "pos_cnum": 4317
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 103,
        "pos_bol": 4214,
        "pos_cnum": 4214
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 105,
        "pos_bol": 4283,
        "pos_cnum": 4317
      },
      "loc_ghost": false
    }
  },
  {
    "psig_desc": [
      "Psig_value",
      {
        "pval_name": {
          "loc2": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 110,
              "pos_bol": 4484,
              "pos_cnum": 4488
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 110,
              "pos_bol": 4484,
              "pos_cnum": 4495
            },
            "loc_ghost": false
          },
          "txt2": "compare"
        },
        "pval_type": {
          "ptyp_desc": [
            "Ptyp_arrow",
            [ "Labelled", "left" ],
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Nolabel" ],
                {
                  "ptyp_desc": [ "Ptyp_var", "a" ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 111,
                      "pos_bol": 4498,
                      "pos_cnum": 4506
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 111,
                      "pos_bol": 4498,
                      "pos_cnum": 4508
                    },
                    "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/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4512
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4514
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [ "Ptyp_constr", "int", [] ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4518
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4521
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 111,
                      "pos_bol": 4498,
                      "pos_cnum": 4512
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 111,
                      "pos_bol": 4498,
                      "pos_cnum": 4521
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 111,
                  "pos_bol": 4498,
                  "pos_cnum": 4506
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 111,
                  "pos_bol": 4498,
                  "pos_cnum": 4521
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            },
            {
              "ptyp_desc": [
                "Ptyp_arrow",
                [ "Labelled", "right" ],
                {
                  "ptyp_desc": [
                    "Ptyp_arrow",
                    [ "Nolabel" ],
                    {
                      "ptyp_desc": [ "Ptyp_var", "b" ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4533
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4535
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    },
                    {
                      "ptyp_desc": [
                        "Ptyp_arrow",
                        [ "Nolabel" ],
                        {
                          "ptyp_desc": [ "Ptyp_var", "b" ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 111,
                              "pos_bol": 4498,
                              "pos_cnum": 4539
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 111,
                              "pos_bol": 4498,
                              "pos_cnum": 4541
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        },
                        {
                          "ptyp_desc": [ "Ptyp_constr", "int", [] ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 111,
                              "pos_bol": 4498,
                              "pos_cnum": 4545
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 111,
                              "pos_bol": 4498,
                              "pos_cnum": 4548
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        }
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4539
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 111,
                          "pos_bol": 4498,
                          "pos_cnum": 4548
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 111,
                      "pos_bol": 4498,
                      "pos_cnum": 4533
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 111,
                      "pos_bol": 4498,
                      "pos_cnum": 4548
                    },
                    "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/either.mli",
                                "pos_lnum": 112,
                                "pos_bol": 4553,
                                "pos_cnum": 4556
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 112,
                                "pos_bol": 4553,
                                "pos_cnum": 4558
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          },
                          {
                            "ptyp_desc": [ "Ptyp_var", "b" ],
                            "ptyp_loc": {
                              "loc_start": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 112,
                                "pos_bol": 4553,
                                "pos_cnum": 4560
                              },
                              "loc_end": {
                                "pos_fname": "./stdlib/either.mli",
                                "pos_lnum": 112,
                                "pos_bol": 4553,
                                "pos_cnum": 4562
                              },
                              "loc_ghost": false
                            },
                            "ptyp_loc_stack": [],
                            "ptyp_attributes": []
                          }
                        ]
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 112,
                          "pos_bol": 4553,
                          "pos_cnum": 4555
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 112,
                          "pos_bol": 4553,
                          "pos_cnum": 4565
                        },
                        "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/either.mli",
                                    "pos_lnum": 112,
                                    "pos_bol": 4553,
                                    "pos_cnum": 4570
                                  },
                                  "loc_end": {
                                    "pos_fname": "./stdlib/either.mli",
                                    "pos_lnum": 112,
                                    "pos_bol": 4553,
                                    "pos_cnum": 4572
                                  },
                                  "loc_ghost": false
                                },
                                "ptyp_loc_stack": [],
                                "ptyp_attributes": []
                              },
                              {
                                "ptyp_desc": [ "Ptyp_var", "b" ],
                                "ptyp_loc": {
                                  "loc_start": {
                                    "pos_fname": "./stdlib/either.mli",
                                    "pos_lnum": 112,
                                    "pos_bol": 4553,
                                    "pos_cnum": 4574
                                  },
                                  "loc_end": {
                                    "pos_fname": "./stdlib/either.mli",
                                    "pos_lnum": 112,
                                    "pos_bol": 4553,
                                    "pos_cnum": 4576
                                  },
                                  "loc_ghost": false
                                },
                                "ptyp_loc_stack": [],
                                "ptyp_attributes": []
                              }
                            ]
                          ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 112,
                              "pos_bol": 4553,
                              "pos_cnum": 4569
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 112,
                              "pos_bol": 4553,
                              "pos_cnum": 4579
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        },
                        {
                          "ptyp_desc": [ "Ptyp_constr", "int", [] ],
                          "ptyp_loc": {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 112,
                              "pos_bol": 4553,
                              "pos_cnum": 4583
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 112,
                              "pos_bol": 4553,
                              "pos_cnum": 4586
                            },
                            "loc_ghost": false
                          },
                          "ptyp_loc_stack": [],
                          "ptyp_attributes": []
                        }
                      ],
                      "ptyp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 112,
                          "pos_bol": 4553,
                          "pos_cnum": 4569
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 112,
                          "pos_bol": 4553,
                          "pos_cnum": 4586
                        },
                        "loc_ghost": false
                      },
                      "ptyp_loc_stack": [],
                      "ptyp_attributes": []
                    }
                  ],
                  "ptyp_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 112,
                      "pos_bol": 4553,
                      "pos_cnum": 4555
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 112,
                      "pos_bol": 4553,
                      "pos_cnum": 4586
                    },
                    "loc_ghost": false
                  },
                  "ptyp_loc_stack": [],
                  "ptyp_attributes": []
                }
              ],
              "ptyp_loc": {
                "loc_start": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 111,
                  "pos_bol": 4498,
                  "pos_cnum": 4526
                },
                "loc_end": {
                  "pos_fname": "./stdlib/either.mli",
                  "pos_lnum": 112,
                  "pos_bol": 4553,
                  "pos_cnum": 4586
                },
                "loc_ghost": false
              },
              "ptyp_loc_stack": [],
              "ptyp_attributes": []
            }
          ],
          "ptyp_loc": {
            "loc_start": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 111,
              "pos_bol": 4498,
              "pos_cnum": 4500
            },
            "loc_end": {
              "pos_fname": "./stdlib/either.mli",
              "pos_lnum": 112,
              "pos_bol": 4553,
              "pos_cnum": 4586
            },
            "loc_ghost": false
          },
          "ptyp_loc_stack": [],
          "ptyp_attributes": []
        },
        "pval_prim": [],
        "pval_attributes": [
          {
            "attr_name": {
              "loc2": {
                "loc_start": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_end": {
                  "pos_fname": "_none_",
                  "pos_lnum": 0,
                  "pos_bol": 0,
                  "pos_cnum": -1
                },
                "loc_ghost": true
              },
              "txt2": "ocaml.doc"
            },
            "attr_payload": [
              "PStr",
              [
                {
                  "pstr_desc": [
                    "Pstr_eval",
                    {
                      "pexp_desc": [
                        "Pexp_constant",
                        [
                          "Pconst_string",
                          " [compare ~left ~right e0 e1] totally orders [e0] and [e1] using [left] and\n    [right] to respectively compare values wrapped by [Left _ ] and [Right _].\n    [Left _] values are smaller than [Right _] values. ",
                          {
                            "loc_start": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 113,
                              "pos_bol": 4587,
                              "pos_cnum": 4587
                            },
                            "loc_end": {
                              "pos_fname": "./stdlib/either.mli",
                              "pos_lnum": 115,
                              "pos_bol": 4745,
                              "pos_cnum": 4802
                            },
                            "loc_ghost": false
                          },
                          null
                        ]
                      ],
                      "pexp_loc": {
                        "loc_start": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 113,
                          "pos_bol": 4587,
                          "pos_cnum": 4587
                        },
                        "loc_end": {
                          "pos_fname": "./stdlib/either.mli",
                          "pos_lnum": 115,
                          "pos_bol": 4745,
                          "pos_cnum": 4802
                        },
                        "loc_ghost": false
                      },
                      "pexp_loc_stack": [],
                      "pexp_attributes": []
                    },
                    []
                  ],
                  "pstr_loc": {
                    "loc_start": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 113,
                      "pos_bol": 4587,
                      "pos_cnum": 4587
                    },
                    "loc_end": {
                      "pos_fname": "./stdlib/either.mli",
                      "pos_lnum": 115,
                      "pos_bol": 4745,
                      "pos_cnum": 4802
                    },
                    "loc_ghost": false
                  }
                }
              ]
            ],
            "attr_loc": {
              "loc_start": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 113,
                "pos_bol": 4587,
                "pos_cnum": 4587
              },
              "loc_end": {
                "pos_fname": "./stdlib/either.mli",
                "pos_lnum": 115,
                "pos_bol": 4745,
                "pos_cnum": 4802
              },
              "loc_ghost": false
            }
          }
        ],
        "pval_loc": {
          "loc_start": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 110,
            "pos_bol": 4484,
            "pos_cnum": 4484
          },
          "loc_end": {
            "pos_fname": "./stdlib/either.mli",
            "pos_lnum": 112,
            "pos_bol": 4553,
            "pos_cnum": 4586
          },
          "loc_ghost": false
        }
      }
    ],
    "psig_loc": {
      "loc_start": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 110,
        "pos_bol": 4484,
        "pos_cnum": 4484
      },
      "loc_end": {
        "pos_fname": "./stdlib/either.mli",
        "pos_lnum": 112,
        "pos_bol": 4553,
        "pos_cnum": 4586
      },
      "loc_ghost": false
    }
  }
]