module Povray:sig..end
There are 3 different ways to create a povray scene:
with the description type scene_desc,
    accumulating to the scene type,
    or with a type that we can print to a screen.
typelocation =float * float * float
module Color:sig..end
typecolor =Color.t
type 
typetriangle =location * location * location
typetriangle_c =triangle * Color.t
type | | | Include of  | |||
| | | Background of  | |||
| | | Camera of  | |||
| | | Light_source of  | |||
| | | Sphere of  | (* | 
 | *) | 
| | | Cone of  | (* | 
 | *) | 
| | | Box of  | (* | 
 | *) | 
| | | Cylinder of  | (* | 
 | *) | 
| | | Mesh of  | (* | 
 | *) | 
| | | MeshC of  | (* | ( | *) | 
module Textures:sig..end
typetexture_def =Textures.stones
type 
val new_scene : unit -> scene
val string_of_scene : scene -> string
val print_scene : scene -> unit
module Inc_file:sig..end
typeinc_file =Inc_file.t
val string_of_inc_file : inc:inc_file -> string
val inc_file_of_string : inc:string -> inc_filestring_of_inc_file is equivalent to Inc_file.to_string
inc_file_of_string is equivalent to Inc_file.of_string
val add_include : scene -> inc:inc_file -> scene
val add_background : scene -> color:color -> scene
val add_light_source : scene ->
       location:float * float * float -> color:color -> scene
val add_camera : scene ->
       location:float * float * float ->
       look_at:float * float * float -> scene
val add_ambient_light : scene -> color:float * float * float -> scene
val new_texture : ?color:color ->
       ?scale:int -> ?def:texture_def -> unit -> texture
val new_checker : color1:color -> color2:color -> unit -> textureval add_sphere : scene ->
       center:float * float * float ->
       radius:float -> ?texture:texture -> unit -> scene
val add_cylinder : scene ->
       center1:float * float * float ->
       center2:float * float * float ->
       radius:float -> ?texture:texture -> unit -> scene
val add_box : scene ->
       corner1:float * float * float ->
       corner2:float * float * float ->
       ?translate:float * float * float ->
       ?rotate:float * float * float ->
       ?texture:texture -> unit -> scene
val add_cone : scene ->
       center1:float * float * float ->
       radius1:float ->
       center2:float * float * float ->
       radius2:float -> ?texture:texture -> unit -> scene
val add_torus : scene ->
       major:float ->
       minor:float ->
       ?translate:float * float * float ->
       ?rotate:float * float * float ->
       ?texture:texture -> unit -> scene
val add_plane : scene ->
       norm:int * int * int ->
       dist:int -> ?texture:texture -> unit -> scene
val add_text : scene ->
       font:string ->
       text:string ->
       ?thickness:float ->
       ?offset:float -> ?texture:texture -> unit -> sceneval get_color : color:color -> string
val get_include : inc:inc_file -> string
val get_background : color:color -> string
val get_light_source : location:float * float * float -> color:color -> string
val get_camera : location:float * float * float -> look_at:float * float * float -> string
val get_ambient_light : color:float * float * float -> string
val get_texture : ?color:color ->
       ?scale:int -> ?def:texture_def -> unit -> string
val get_checker : color1:color -> color2:color -> unit -> stringval get_sphere : center:float * float * float ->
       radius:float -> ?texture:string -> unit -> string
val get_cylinder : center1:float * float * float ->
       center2:float * float * float ->
       radius:float -> ?texture:string -> unit -> string
val get_box : corner1:float * float * float ->
       corner2:float * float * float ->
       ?translate:float * float * float ->
       ?rotate:float * float * float -> ?texture:string -> unit -> string
val get_cone : center1:float * float * float ->
       radius1:float ->
       center2:float * float * float ->
       radius2:float -> ?texture:string -> unit -> string
val get_torus : major:float ->
       minor:float ->
       ?translate:float * float * float ->
       ?rotate:float * float * float -> ?texture:string -> unit -> string
val get_plane : norm:int * int * int -> dist:int -> ?texture:string -> unit -> string
val get_text : font:string ->
       text:string ->
       ?thickness:float -> ?offset:float -> ?texture:string -> unit -> stringmodule Desc:sig..end
module Float:sig..end
module Int:sig..end
module Mesh:sig..end
module MeshC:sig..end