Skip to content
New issue

Have a question about this project? # for a free GitHub account to open an issue and contact its maintainers and the community.

By clicking “#”, you agree to our terms of service and privacy statement. We’ll occasionally send you account related emails.

Already on GitHub? # to your account

Dead links to hidden items appearing in documentation #560

Closed
lpw25 opened this issue Jan 7, 2021 · 0 comments · Fixed by #583
Closed

Dead links to hidden items appearing in documentation #560

lpw25 opened this issue Jan 7, 2021 · 0 comments · Fixed by #583
Assignees
Milestone

Comments

@lpw25
Copy link
Contributor

lpw25 commented Jan 7, 2021

In the Field module in base we have the following code:

(**/**)
module For_generated_code : sig
  (*_ don't use this by hand, it is only meant for ppx_fields_conv *)

  type ('perm, 'record, 'field) t =
    { force_variance : 'perm -> unit
    ; name : string
    ; setter : ('record -> 'field -> unit) option
    ; getter : 'record -> 'field
    ; fset : 'record -> 'field -> 'record
    }

  val opaque_identity : 'a -> 'a
end
(**/**)

(** ['record] is the type of the record.  ['field] is the type of the
    values stored in the record field with name [name]. ['perm] is a way
    of restricting the operations that can be used. *)
type ('perm, 'record, 'field) t_with_perm =
  | Field of ('perm, 'record, 'field) For_generated_code.t
[@@unboxed]

The For_generated_code is correctly left out of the documentation, however the t_with_perm type is documented as:

type ('perm, 'record, 'field) t_with_perm =
  | Field of ('perm, 'record, 'field) For_generated_code.t

with For_generated_code.t a dead link. It should instead be documented as:

type ('perm, 'record, 'field) t_with_perm
# for free to join this conversation on GitHub. Already have an account? # to comment
Labels
None yet
Projects
None yet
Development

Successfully merging a pull request may close this issue.

3 participants