systems changed the topic of #ocaml to: Archive of Caml Weekly News http://pauillac.inria.fr/~aschmitt/cwn/ | ICFP Programming Contest 2003 http://www.dtek.chalmers.se/groups/icfpcontest/ | A tutorial http://merjis.com/richj/computers/ocaml/tutorial/ | Good free book http://cristal.inria.fr/~remy/cours/appsem/ | Mailing list (best mailing list ever for any computer language) http://caml.inria.fr/bin/wilma/caml-list
__buggs is now known as buggs
bk_ has quit ["I'll be back"]
buggs is now known as buggs|afk
async has joined #ocaml
Kinners has joined #ocaml
Kinners has quit [Read error: 54 (Connection reset by peer)]
mrvn_ has joined #ocaml
mrvn has quit [Read error: 60 (Operation timed out)]
whee has quit ["Leaving"]
async has quit ["Lost terminal"]
srv has joined #ocaml
teratorn has quit [leguin.freenode.net irc.freenode.net]
rox has quit [leguin.freenode.net irc.freenode.net]
teratorn has joined #ocaml
rox has joined #ocaml
d-bug has joined #ocaml
buggs|afk is now known as buggs
themus_ has joined #ocaml
themus__ has quit [Read error: 110 (Connection timed out)]
d-bug has quit [Read error: 104 (Connection reset by peer)]
ita|zzz is now known as ita
d-bug has joined #ocaml
rox has quit [leguin.freenode.net irc.freenode.net]
teratorn has quit [leguin.freenode.net irc.freenode.net]
teratorn has joined #ocaml
rox has joined #ocaml
Verbed has quit ["Client exiting"]
whee has joined #ocaml
buggs is now known as buggs|afk
karryall has quit ["ERC vVersion 3.0 $Revision: 1.328 $ (IRC client for Emacs)"]
polin8 has quit [Remote closed the connection]
mattam_ has joined #ocaml
mattam has quit [Read error: 110 (Connection timed out)]
polin8 has joined #ocaml
polin8 has quit [Client Quit]
karryall has joined #ocaml
polin8 has joined #ocaml
bk_ has joined #ocaml
systems has joined #ocaml
systems has quit [Read error: 104 (Connection reset by peer)]
d-bug has left #ocaml []
systems has joined #ocaml
mattam_ is now known as mattam
asquii has joined #ocaml
systems has quit ["Client Exiting"]
asqui has quit [Read error: 104 (Connection reset by peer)]
asquii is now known as asqui
<Maddas> ocaml has some pretty advanced features heh :)
<ita> the native code generation is greate
Riastrad1 has joined #ocaml
Riastradh has quit [Nick collision from services.]
Riastrad1 is now known as Riastradh
<srv> http://www.freefolks.org/tmp/method.txt <- Consider the following method. Can someone tell me what is the code to write in the .mli file?. I've tried "method private dump2dArray : 'b array -> ('b -> string) -> unit", but it won't compile... :(
<whee> srv: run ocamlc -i somefile.ml
<whee> err, heh
<whee> I found a reference to that type of error on caml-list
<srv> any url (or keywords for searching)?
<whee> I just searched for "the unversal variable" "would escape its scope" on google
<whee> there's some on google groups and the web search
<whee> and I meant universal :|
<srv> oki doki
<srv> thx a lot :)
drWorm has quit ["mov"]
systems has joined #ocaml
<mattam> how to use type declaration in the including module ? e.g: module A = struct type t = blabla module B = struct type t = A.t blabla end end ?
<mattam> i cant define B.t
<Smerdyakov> I don't understand what you mean.
<mattam> better indented:
<mattam> module A =
<mattam> struct
<mattam> type t = A | B
<mattam> module B =
<mattam> struct
<mattam> type t = SomeB of A.t | Other
<mattam> end
<mattam> end
<Smerdyakov> Change A.t to t
<mattam> does not work
<mattam> but that may be a problem of my code
* mattam rechecking
<Smerdyakov> Oh, yes, that won't work.
<Smerdyakov> You could copy t into a differently named variable in A.
<Smerdyakov> And use that in B.
<mattam> i have a problem with rectypes also :)
<mattam> i must enable them for the A declaration, but then, writing type t = sometype t fails
<mattam> adding a type between them solves the problem
<Smerdyakov> You can only use recursion for tagged-union types.
<Smerdyakov> And I think I also learned you can use them from within records.
<mattam> yes, just seen that!
<Smerdyakov> Basically, things that will be implemented with pointers.
<mrvn_> mattam: Make two file and write .mli files.
<mrvn_> mattam: And SomeB of A.t | Other is better done via "A.t option"
systems has quit [Read error: 54 (Connection reset by peer)]
<mrvn_> Or put them in the same module and use 2and".
<mrvn_> s/2/"/
buggs|afk is now known as buggs
buggs|afk has joined #ocaml
systems has joined #ocaml
lophty__ has joined #ocaml
buggs has quit [Read error: 110 (Connection timed out)]
systems has quit ["Client Exiting"]
buggs|afk is now known as buggs
__DL__ has joined #ocaml
__DL__ has quit [Client Quit]
phubuh has joined #ocaml
asqui has quit [Read error: 104 (Connection reset by peer)]
buggs is now known as buggs|afk
Verbed has joined #ocaml
Riastrad1 has joined #ocaml
Riastradh has quit [Nick collision from services.]
Riastrad1 is now known as Riastradh
bk_ has quit ["Terminated with extreme prejudice - dircproxy 1.0.5"]
bk_ has joined #ocaml
systems has joined #ocaml
systems has left #ocaml []
mrvn has joined #ocaml
ita has quit ["kill me"]
mrvn_ has quit [Read error: 110 (Connection timed out)]
srv has quit [Remote closed the connection]
systems has joined #ocaml
systems has quit ["Client Exiting"]
freitag has joined #ocaml
ita has joined #ocaml