This file is indexed.

/usr/lib/ocaml/netstring/netgssapi_auth.mli is in libocamlnet-ocaml-dev 4.0.4-1build3.

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
(* $Id: netgssapi_auth.mli 2195 2015-01-01 12:23:39Z gerd $ *)

(** Authentication helpers for GSSAPI *)

open Netsys_gssapi

module type CONFIG = sig
    val raise_error : string -> 'a
end

module Manage(G:GSSAPI) : sig
  (** General management *)

  val delete_context : G.context option -> unit -> unit
    (** Deletes the context, ignoring any error *)

  val format_status : ?fn:string -> 
                      ?minor_status:int32 -> major_status ->
                      string
  
end

module Auth (G:GSSAPI)(C:CONFIG) : sig
  (** Status *)

  val check_status : ?fn:string -> 
                     ?minor_status:int32 -> major_status ->
                     unit
    (** If the [major_status] indicates an error, an error string is formed,
        optionally including the function name [fn] and the detailed information
        derived from [minor_status]. Then, the function [C.raise_error] is
        called with the string as argument.
     *)

  (** Client configuration *)

  val get_initiator_name : client_config -> G.name
  val get_initiator_cred : initiator_name:G.name -> 
                           client_config -> G.credential
  val acquire_initiator_cred : initiator_name:G.name -> 
                               client_config -> G.credential
  val get_target_name : ?default:(string * oid) ->
                        client_config -> G.name
  val get_client_flags : client_config ->
                         req_flag list
  val check_client_flags : client_config -> 
                           ret_flag list -> unit
  val init_sec_context :
         initiator_cred:G.credential ->
         context:G.context option ->
         target_name:G.name ->
         req_flags:req_flag list ->
         chan_bindings:channel_bindings option ->
         input_token:token option ->
         client_config -> 
           (G.context * token * ret_flag list * client_props option)
    (** Calls [G.init_sec_context], and returns
        [(out_context,out_token,flags,props_opt)]. If [props_opt] is returned
        the context setup is done.

        Checks already for errors, and client flags.
     *)

  (** Server configuration *)

  val get_acceptor_name : server_config -> G.name
  val get_acceptor_cred : acceptor_name:G.name ->
                          server_config -> G.credential
  val get_server_flags : server_config ->
                         req_flag list
  val check_server_flags : server_config -> 
                           ret_flag list -> unit

  val accept_sec_context :
        acceptor_cred:G.credential -> 
        context:G.context option ->
        chan_bindings:channel_bindings option ->
        input_token:token ->
        server_config ->
          (G.context * token * ret_flag list * server_props option)
    (** Calls [G.accept_sec_context], and returns
        [(out_context,out_token,flags,props_opt)]. If [props_opt] is returned
        the context setup is done.

        Checks already for errors, and server flags.
     *)

  (** Helpers *)

  val get_display_name : G.name -> string * oid
  val get_exported_name : G.name -> string


end