/usr/lib/ocaml/deriving/dynmap.mli is in libderiving-ocaml-dev 0.1.1a-3build4.
This file is owned by root:root, with mode 0o644.
The actual contents of the file can be viewed below.
1 2 3 4 5 6 7 8 9 10 11 12 13 14 15 16 17 18 19 20 | (* Finite map : dynamic |-> t *)
open Typeable
module Comp (T : Typeable) (E : Eq.Eq with type a = T.a) :
sig
type a = T.a
val eq : dynamic -> dynamic -> bool
end
module DynMap :
sig
type comparator = dynamic -> dynamic -> bool
type 'a t
val empty : 'a t
val add : dynamic -> 'a -> comparator -> 'a t -> 'a t
val mem : dynamic -> 'a t -> bool
val find : dynamic -> 'a t -> 'a option
val iter : (dynamic -> 'a -> unit) -> 'a t -> unit
end
|