/usr/lib/ocaml/galax/optimization_util.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 | (***********************************************************************)
(* *)
(* GALAX *)
(* XQuery Engine *)
(* *)
(* Copyright 2001-2007. *)
(* Distributed only by permission. *)
(* *)
(***********************************************************************)
(* $Id: optimization_util.mli,v 1.25 2007/02/12 21:15:33 simeon Exp $ *)
(* Module: Optimization_util
Description:
This module contains some utility functions used during algebraic
optimization.
*)
open Namespace_names
open Algebra_type
open Logical_algebra_types
open Xquery_algebra_ast
open Xquery_common_ast
open Optimization_walker
(* tuple reanming functions *)
val replace_tuple_field_name :
rqname -> rqname -> bool -> logical_algop_expr -> logical_algop_expr * bool
val replace_tuple_name :
logical_compile_context ->
rqname ->
rqname ->
logical_algop_expr ->
logical_algop_expr * bool
val is_update : logical_algop_expr -> bool
val contain_updates : logical_algop_expr -> bool
val count_tuple_field_access : logical_algop_expr -> (crname * int) list
(* Some generic stuff *)
val wrap_sep_sequence : ('a,'b) Compile_context.compile_context -> logical_algop_expr -> crname * logical_algop_expr
val wrap_map_index_name : crname -> logical_algop_expr -> logical_algop_expr
val wrap_map_index : ('a,'b) Compile_context.compile_context -> logical_algop_expr -> crname * logical_algop_expr
val wrap_map_null_named : crname -> logical_algop_expr -> logical_algop_expr
val wrap_map_null : ('a,'b) Compile_context.compile_context -> logical_algop_expr -> crname * logical_algop_expr
val generic_snap_free_wrapper :
(logical_compile_context ->
logical_algop_expr ->
logical_algop_expr * bool) ->
bool ref ->
logical_compile_context ->
logical_algop_expr ->
((unit, Alg_path_struct.path_annotation) aalgop_expr * sub_expr_kind * int) option ->
logical_algop_expr ->
logical_algop_expr
|