This file is indexed.

/usr/lib/ocaml/galax/path_analysis.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
(***********************************************************************)
(*                                                                     *)
(*                                 GALAX                               *)
(*                              XQuery Engine                          *)
(*                                                                     *)
(*  Copyright 2001-2007.                                               *)
(*  Distributed only by permission.                                    *)
(*                                                                     *)
(***********************************************************************)

(* $Id: path_analysis.mli,v 1.11 2007/02/01 22:08:52 simeon Exp $ *)

(* Module: Path_analysis
   Description:
     This module implements the path analysis algorithm used by
     projection.
*)


open Path_struct
open Analysis_context


(* Applies final serialization operation on the path sequences *)

val serialize :
    rooted_path_sequence * rooted_path_sequence -> rooted_path_sequence


(* Core expression level path analysis *)

(* 
val cexpr_path_analysis :
    analysis_context ->
      'a Xquery_core_ast.cexpr -> rooted_path_sequence * rooted_path_sequence

val cexpr_path_analysis_optim :
    analysis_context ->
      'a Xquery_core_ast.cexpr ->
	rooted_path_sequence * rooted_path_sequence * Optim_vars.optim_vars
*)

(* Query level path analysis *)

val path_analysis_of_cexpr      : analysis_context -> Xquery_core_ast.acexpr   -> rooted_path_sequence
val path_analysis_of_cstatement : analysis_context -> Xquery_core_ast.acstatement -> rooted_path_sequence
val path_analysis_of_cstatement_optim : analysis_context -> Xquery_core_ast.acstatement -> rooted_path_sequence
val path_analysis_of_cxmodule   : Xquery_core_ast.acxmodule   -> rooted_path_sequence * analysis_context
val path_analysis_of_cxmodule_optim   : Xquery_core_ast.acxmodule   -> rooted_path_sequence * analysis_context
(*val path_analysis_of_cupdate    : Xquery_core_ast.acupdate    -> rooted_path_sequence*)
val path_analysis_of_cprolog    : Xquery_core_ast.acprolog    -> rooted_path_sequence * analysis_context

(* Printing of analysis results *)

val print_intermediate_analysis :
    Format.formatter -> rooted_path_sequence * rooted_path_sequence -> unit

val print_full_analysis :
    Format.formatter -> rooted_path_sequence -> unit