sig
type xrs
and t =
[ `Array of XmlRPCTypes.t array
| `Base64 of string
| `Boolean of bool
| `DateTime of string
| `Double of float
| `Int of int32
| `RawBase64 of string
| `String of string
| `Struct of XmlRPCTypes.xrs
| `Unit ]
and fault = { desc : string; code : int; }
val make_struct : unit -> XmlRPCTypes.xrs
val add_elem : XmlRPCTypes.xrs -> string -> XmlRPCTypes.t -> unit
val find_elem : XmlRPCTypes.xrs -> string -> XmlRPCTypes.t
exception Bad_type
val escape_cdata : string -> string
val xr_of_int : int -> XmlRPCTypes.t
val xr_of_int32 : int32 -> XmlRPCTypes.t
val xr_of_string : string -> XmlRPCTypes.t
val xr_of_bool : bool -> XmlRPCTypes.t
val xr_of_float : float -> XmlRPCTypes.t
val xr_of_base64 : string -> XmlRPCTypes.t
val xr_of_rawbase64 : string -> XmlRPCTypes.t
val xr_of_array : XmlRPCTypes.t array -> XmlRPCTypes.t
val xr_of_struct : XmlRPCTypes.xrs -> XmlRPCTypes.t
val skip : XmlRPCTypes.t
val ml_of_int : XmlRPCTypes.t -> int
val ml_of_int32 : XmlRPCTypes.t -> int32
val ml_of_string : XmlRPCTypes.t -> string
val ml_of_float : XmlRPCTypes.t -> float
val ml_of_bool : XmlRPCTypes.t -> bool
val ml_of_base64 : XmlRPCTypes.t -> string
val ml_of_rawbase64 : XmlRPCTypes.t -> string
val ml_of_struct : XmlRPCTypes.t -> XmlRPCTypes.xrs
val ml_of_datetime : XmlRPCTypes.t -> string
val ml_of_fault : XmlRPCTypes.t -> XmlRPCTypes.fault
val ml_of_array : XmlRPCTypes.t -> XmlRPCTypes.t array
val ml_of_intarray : XmlRPCTypes.t -> int array
val ml_of_int32array : XmlRPCTypes.t -> int32 array
val ml_of_floatarray : XmlRPCTypes.t -> float array
val ml_of_datetimearray : XmlRPCTypes.t -> string array
val ml_of_base64array : XmlRPCTypes.t -> string array
val ml_of_rawbase64array : XmlRPCTypes.t -> string array
val ml_of_stringarray : XmlRPCTypes.t -> string array
val ml_of_boolarray : XmlRPCTypes.t -> bool array
val ml_of_structarray : XmlRPCTypes.t -> XmlRPCTypes.xrs array
val print_type : XmlRPCTypes.t -> string
val parse_value :
('a Pxp_document.node #Pxp_document.extension as 'a) Pxp_document.node ->
XmlRPCTypes.t
end