215 lines
7.0 KiB
Plaintext
215 lines
7.0 KiB
Plaintext
Objective Caml version 3.04+15 (2002-06-18)
|
|
|
|
# * * * # type 'a t = { t : 'a; }
|
|
# type 'a fold = { fold : 'b. f:('b -> 'a -> 'b) -> init:'b -> 'b; }
|
|
# val f : 'a list -> 'a fold = <fun>
|
|
# - : int = 6
|
|
# class ['a] ilist :
|
|
'a list ->
|
|
object ('b)
|
|
val l : 'a list
|
|
method add : 'a -> 'b
|
|
method fold : f:('c -> 'a -> 'c) -> init:'c -> 'c
|
|
end
|
|
# class virtual ['a] vlist :
|
|
object ('b)
|
|
method virtual add : 'a -> 'b
|
|
method virtual fold : f:('c -> 'a -> 'c) -> init:'c -> 'c
|
|
end
|
|
# class ilist2 :
|
|
int list ->
|
|
object ('a)
|
|
val l : int list
|
|
method add : int -> 'a
|
|
method fold : f:('b -> int -> 'b) -> init:'b -> 'b
|
|
end
|
|
# class ['a] ilist3 :
|
|
'a list ->
|
|
object ('b)
|
|
val l : 'a list
|
|
method add : 'a -> 'b
|
|
method fold : f:('c -> 'a -> 'c) -> init:'c -> 'c
|
|
end
|
|
# class ['a] ilist4 :
|
|
'a list ->
|
|
object ('b)
|
|
val l : 'a list
|
|
method add : 'a -> 'b
|
|
method fold : f:('c -> 'a -> 'c) -> init:'c -> 'c
|
|
end
|
|
# class ['a] ilist5 :
|
|
'a list ->
|
|
object ('b)
|
|
val l : 'a list
|
|
method add : 'a -> 'b
|
|
method fold : f:('c -> 'a -> 'c) -> init:'c -> 'c
|
|
method fold2 : f:('d -> 'a -> 'd) -> init:'d -> 'd
|
|
end
|
|
# class ['a] ilist6 :
|
|
'a list ->
|
|
object ('b)
|
|
val l : 'a list
|
|
method add : 'a -> 'b
|
|
method fold : f:('c -> 'a -> 'c) -> init:'c -> 'c
|
|
method fold2 : f:('d -> 'a -> 'd) -> init:'d -> 'd
|
|
end
|
|
# class virtual ['a] olist :
|
|
object method virtual fold : f:('a -> 'b -> 'b) -> init:'b -> 'b end
|
|
# class ['a] onil :
|
|
object method fold : f:('a -> 'b -> 'b) -> init:'b -> 'b end
|
|
# class ['a] ocons :
|
|
hd:'a ->
|
|
tl:'a olist ->
|
|
object
|
|
val hd : 'a
|
|
val tl : 'a olist
|
|
method fold : f:('a -> 'b -> 'b) -> init:'b -> 'b
|
|
end
|
|
# class ['a] ostream :
|
|
hd:'a ->
|
|
tl:'a ostream ->
|
|
object
|
|
val hd : 'a
|
|
val tl : < empty : bool; fold : 'b. f:('a -> 'b -> 'b) -> init:'b -> 'b >
|
|
method empty : bool
|
|
method fold : f:('a -> 'c -> 'c) -> init:'c -> 'c
|
|
end
|
|
# class ['a] ostream1 :
|
|
hd:'a ->
|
|
tl:'b ->
|
|
object ('b)
|
|
val hd : 'a
|
|
val tl : 'b
|
|
method fold : f:('a -> 'c -> 'c) -> init:'c -> 'c
|
|
method hd : 'a
|
|
method tl : 'b
|
|
end
|
|
# class vari : object method m : [< `A | `B | `C] -> int end
|
|
# class vari : object method m : [< `A | `B | `C] -> int end
|
|
# module V : sig type v = [ `A | `B | `C] val m : [< v] -> int end
|
|
# class varj : object method m : [< V.v] -> int end
|
|
# module type T =
|
|
sig class vari : object method m : [< `A | `B | `C] -> int end end
|
|
# module M0 :
|
|
sig class vari : object method m : [< `A | `B | `C] -> int end end
|
|
# module M : T
|
|
# val v : M.vari = <obj>
|
|
# - : int = 1
|
|
# class point :
|
|
x:int ->
|
|
y:int -> object val x : int val y : int method x : int method y : int end
|
|
# class color_point :
|
|
x:int ->
|
|
y:int ->
|
|
color:string ->
|
|
object
|
|
val color : string
|
|
val x : int
|
|
val y : int
|
|
method color : string
|
|
method x : int
|
|
method y : int
|
|
end
|
|
# class circle :
|
|
#point ->
|
|
r:int ->
|
|
object val p : point val r : int method distance : #point -> float end
|
|
# val p0 : point = <obj>
|
|
val p1 : point = <obj>
|
|
val cp : color_point = <obj>
|
|
val c : circle = <obj>
|
|
val d : float = 11.4536240471
|
|
# val f : < m : 'a. 'a -> 'a > -> < m : 'b. 'b -> 'b > = <fun>
|
|
# Characters 41-42:
|
|
This expression has type < m : 'a. 'a -> 'a list > but is here used with type
|
|
< m : 'a. 'a -> 'b >
|
|
The universal variable 'a would escape its scope
|
|
# class id : object method id : 'a -> 'a end
|
|
# class type id_spec = object method id : 'a -> 'a end
|
|
# class id_impl : object method id : 'a -> 'a end
|
|
# class a : object method m : bool end
|
|
class b : object method id : 'a -> 'a end
|
|
# Characters 72-77:
|
|
This method has type 'a -> 'a which is less general than 'b. 'b -> 'a
|
|
# Characters 75-80:
|
|
This method has type 'a -> 'a which is less general than 'b. 'b -> 'a
|
|
# Characters 80-85:
|
|
This method has type 'a -> 'a which is less general than 'b. 'b -> 'b
|
|
# Characters 92-159:
|
|
This method has type 'a -> 'a which is less general than 'b. 'b -> 'b
|
|
# class c : object method m : 'a -> 'b -> 'a end
|
|
# val f1 : id -> int * bool = <fun>
|
|
# val f2 : id -> int * bool = <fun>
|
|
# Characters 24-28:
|
|
This expression has type bool but is here used with type int
|
|
# Characters 27-31:
|
|
Warning: This use of a polymorphic method is not principal
|
|
Characters 35-39:
|
|
Warning: This use of a polymorphic method is not principal
|
|
val f4 : id -> int * bool = <fun>
|
|
# class c : object method m : #id -> int * bool end
|
|
# class id2 : object method id : 'a -> 'a method mono : int -> int end
|
|
# val app : int * bool = (1, true)
|
|
# Characters 4-25:
|
|
The type abbreviation foo is cyclic
|
|
# class ['a] bar : 'a -> object end
|
|
# type 'a foo = 'a foo bar
|
|
# - : (< m : 'b. 'b * 'a > as 'a) -> 'c * (< m : 'e. 'e * 'd > as 'd) = <fun>
|
|
# - : (< m : 'b. 'a * 'b list > as 'a) ->
|
|
(< m : 'd. 'c * 'd list > as 'c) * 'e list
|
|
= <fun>
|
|
# val f :
|
|
(< m : 'b. 'a * (< n : 'b; .. > as 'b) > as 'a) ->
|
|
(< m : 'd. 'c * (< n : 'd; .. > as 'd) > as 'c) * (< n : 'e; .. > as 'e) =
|
|
<fun>
|
|
# - : (< p : 'b. < m : 'b; n : 'a; .. > as 'b > as 'a) ->
|
|
(< m : 'c; n : < p : 'e. < m : 'e; n : 'd; .. > as 'e > as 'd; .. > as 'c)
|
|
= <fun>
|
|
# type sum = T of < id : 'a. 'a -> 'a >
|
|
# - : sum -> 'a -> 'a = <fun>
|
|
# type record = { r : < id : 'a. 'a -> 'a >; }
|
|
# - : record -> 'a -> 'a = <fun>
|
|
# - : record -> 'a -> 'a = <fun>
|
|
# class myself : object ('a) method self : 'b -> 'a end
|
|
# class number :
|
|
object ('a)
|
|
val num : int
|
|
method num : int
|
|
method prev : 'a
|
|
method succ : 'a
|
|
method switch : zero:(unit -> 'b) -> prev:('a -> 'b) -> 'b
|
|
end
|
|
# val id : 'a -> 'a = <fun>
|
|
# class c : object method id : 'a -> 'a end
|
|
# class c' : object method id : 'a -> 'a end
|
|
# class d :
|
|
object
|
|
val mutable count : int
|
|
method count : int
|
|
method id : 'a -> 'a
|
|
method old : 'b -> 'b
|
|
end
|
|
# class ['a] olist :
|
|
'a list ->
|
|
object ('b)
|
|
val l : 'a list
|
|
method cons : 'a -> 'b
|
|
method fold : f:('a -> 'c -> 'c) -> init:'c -> 'c
|
|
end
|
|
# val sum : int #olist -> int = <fun>
|
|
# val count : 'a #olist -> int = <fun>
|
|
# val append : 'a #olist -> ('a #olist as 'b) -> 'b = <fun>
|
|
# type 'a t = unit
|
|
# class o : object method x : [> `A] t -> unit end
|
|
# class c : object method m : d end
|
|
class d : ?x:int -> unit -> object end
|
|
# class d : ?x:int -> unit -> object end
|
|
class c : object method m : d end
|
|
# class type numeral = object method fold : ('a -> 'a) -> 'a -> 'a end
|
|
class zero : object method fold : ('a -> 'a) -> 'a -> 'a end
|
|
class next : #numeral -> object method fold : ('a -> 'a) -> 'a -> 'a end
|
|
# class type node_type = object method as_variant : [> `Node of node_type] end
|
|
# class node : node_type
|
|
# class node : object method as_variant : [> `Node of node_type] end
|
|
#
|