/usr/lib/ocaml/galax/print_common.mli is in libgalax-ocaml-dev 1.1-12.
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 69 70 71 72 73 74 75 76 77 78 79 80 81 82 83 84 85 86 87 88 89 90 91 92 93 94 95 96 97 98 99 100 101 102 103 | (***********************************************************************)
(* *)
(* GALAX *)
(* XQuery Engine *)
(* *)
(* Copyright 2001-2007. *)
(* Distributed only by permission. *)
(* *)
(***********************************************************************)
(* $Id: print_common.mli,v 1.9 2007/02/01 22:08:45 simeon Exp $ *)
(* Module Print_common
Description:
This module implements pretty-printing for some common parts of
the ASTs.
*)
open Xquery_common_ast
(**************)
(* Occurrence *)
(**************)
val print_occurence : Format.formatter -> (Occurrence.occurs * Occurrence.occurs) option -> unit
(************************)
(* Names and namesapces *)
(************************)
(* Unresolved QNames *)
val print_uqname : Format.formatter -> Namespace_names.uqname -> unit
(* Resolved QNames *)
val print_rqname : Format.formatter -> Namespace_names.rqname -> unit
val print_uri_rqname : Format.formatter -> Namespace_names.rqname -> unit
(***********)
(* Symbols *)
(***********)
val print_symbol : Format.formatter -> Namespace_symbols.symbol -> unit
(*********)
(* Types *)
(*********)
val print_nillable : Format.formatter -> Xquery_common_ast.nillable -> unit
val print_mixed : Format.formatter -> Xquery_common_ast.mixed -> unit
(***************************)
(* Atomic types and values *)
(***************************)
(* Atomic types *)
val print_literal : Format.formatter -> Xquery_common_ast.literal -> unit
val string_of_proto_value : Datatypes.atomic_type -> string
val print_proto_value : Format.formatter -> Datatypes.atomic_type -> unit
val print_atomic_type : Format.formatter -> Datatypes.atomic_type -> unit
(***************************)
(* Common XPath structures *)
(***************************)
(* Binary operators *)
val print_bop : Format.formatter -> Xquery_common_ast.binop -> unit
val print_uop : Format.formatter -> Xquery_common_ast.unaryop -> unit
(* XPath Axis *)
val print_axis : Format.formatter -> Xquery_common_ast.axis -> unit
(****************************)
(* Common XQuery structures *)
(****************************)
(* Validation mode *)
val print_validation_mode : Format.formatter -> Xquery_common_ast.validation_mode -> unit
(* Sort kinds *)
val print_sortkind : Format.formatter -> Xquery_common_ast.sortkind -> unit
val print_emptysortkind : Format.formatter -> Xquery_common_ast.emptysortkind -> unit
val print_stablekind : Format.formatter -> Xquery_common_ast.stablekind -> unit
(* Should be moved *)
val string_of_axis : Xquery_common_ast.axis -> string
val print_snap_modifier : Format.formatter -> Xquery_common_ast.snap_modifier -> unit
val updating_flag_to_string : updating_modifier -> string
|