/usr/lib/ocaml/ocamlgraph/graphml.mli is in libocamlgraph-ocaml-dev 1.8.6-1build2.
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 21 22 23 24 25 26 27 28 29 30 31 32 33 34 35 36 37 38 39 40 41 42 43 44 45 46 47 48 49 50 51 52 53 54 55 56 57 58 59 60 61 62 63 64 65 66 67 68 | (******************************************************************************)
(* *)
(* Copyright (C) 2012 Pietro Abate <pietro.abate@pps.jussieu.fr> *)
(* *)
(* This library is free software: you can redistribute it and/or modify *)
(* it under the terms of the GNU Lesser General Public License as *)
(* published by the Free Software Foundation, either version 3 of the *)
(* License, or (at your option) any later version. A special linking *)
(* exception to the GNU Lesser General Public License applies to this *)
(* library, see the COPYING file for more information. *)
(* *)
(******************************************************************************)
(** Generic GraphMl Printer *)
(** Graph information required by Graphml *)
module type G = sig
type t
type vertex
module E : sig
type t
val src: t -> vertex
val dst : t -> vertex
end
val is_directed : bool
val iter_vertex : (vertex -> unit) -> t -> unit
val iter_edges_e : (E.t -> unit) -> t -> unit
end
(** Graphml Printer given a graph and required info *)
module Print
(G: G)
(L : sig
val vertex_properties : (string * string * string option) list
(** List of the type of the vertex proprierties.
The format is (id,type,default). *)
val edge_properties : (string * string * string option) list
(** List of the type of the edge proprierties. *)
val map_vertex : G.vertex -> (string * string) list
(** Associates to each vertex a key/value list where
the key is the id of a vertex attribute and the value is the value
associated to this vertex *)
val map_edge : G.E.t -> (string * string) list
(** Associates to each edge a key/value list *)
val vertex_uid : G.vertex -> int
(** @return a unique integer identifier for the vertex *)
val edge_uid : G.E.t -> int
(** @return a unique integer identifier for the edge *)
end) :
sig
val print : Format.formatter -> G.t -> unit
(** [print fmt graph] print the GraphMl representation of the given graph
on the given formatter *)
end
(*
Local Variables:
compile-command: "make -C .."
End:
*)
|