ChanServ changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/ | OCaml 4.00.1 http://bit.ly/UHeZyT | http://www.ocaml-lang.org
Progster has joined #ocaml
arneis has quit [Ping timeout: 245 seconds]
hyperboreean has quit [Ping timeout: 246 seconds]
hyperboreean has joined #ocaml
Progster has quit [Ping timeout: 260 seconds]
avsm has quit [Quit: Leaving.]
TDJACR has joined #ocaml
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
madroach has quit [Ping timeout: 244 seconds]
madroach has joined #ocaml
Jeaye has quit [Ping timeout: 276 seconds]
Jeaye has joined #ocaml
mcstar has quit [Quit: mcstar]
Neros has quit [Ping timeout: 264 seconds]
Yoric has quit [Ping timeout: 246 seconds]
Yoric has joined #ocaml
caligula__ has quit [Ping timeout: 245 seconds]
Yoric has quit [Ping timeout: 246 seconds]
avsm has joined #ocaml
avsm has quit [Client Quit]
tac has joined #ocaml
CoverSlide has quit [Ping timeout: 245 seconds]
caligula__ has joined #ocaml
OCamlGuy has joined #ocaml
<OCamlGuy> why am i getting this error http://ideone.com/BINI6M
<pippijn> OCamlGuy: you're not using camlp4
<OCamlGuy> huh?
caligula__ has quit [Read error: Operation timed out]
<OCamlGuy> pippijn: ?
<pippijn> OCamlGuy: you are using a syntax extension, but no preprocessor
caligula__ has joined #ocaml
<OCamlGuy> pippijn: do i just add the -pp flag then?
Vinnipeg has joined #ocaml
<pippijn> yes, and pass camlp4o with the appropriate syntax extensions as argument to -pp
CoverSlide has joined #ocaml
mjonsson has quit [Remote host closed the connection]
tac has quit [Quit: Page closed]
tufisi has joined #ocaml
OCamlGuy_ has joined #ocaml
OCamlGuy has quit [Read error: Connection reset by peer]
OCamlGuy_ is now known as OCamlGuy
<OCamlGuy> Can someone help me with this error http://ideone.com/d74gDh
<OCamlGuy> pippijn: you still there?
<julm> OCamlGuy: i think you want: | Branch of 'a tree * 'a tree
<OCamlGuy> no i dont
<OCamlGuy> the type is exactly what i want
<pippijn> your paste is not loading here
<pippijn> ah, now it is
<OCamlGuy> pippijn: do you know how i can fix it?
tufisi has quit [Ping timeout: 244 seconds]
<OCamlGuy> pippijn: ...
<pippijn> OCamlGuy: you are being very rude
<OCamlGuy> pippijn: sorry
<pippijn> OCamlGuy: what is the type of (z, zz)?
<OCamlGuy> (int * int) tree
<pippijn> what is the type of z?
<OCamlGuy> int tree
<pippijn> what is the type of (1, 2)?
<OCamlGuy> (int * int)
<OCamlGuy> i think
<pippijn> what is the type of 1?
<OCamlGuy> int
<pippijn> so if the type of 1 is int, and the type of (1, 2) is int * int
<pippijn> and the type of z is int tree
<pippijn> what is the type of (z, zz)?
avsm has joined #ocaml
<OCamlGuy> int tree * int tree
<pippijn> right
<pippijn> do you see the problem?
<OCamlGuy> yes
<pippijn> do you know the solution?
<OCamlGuy> no
answer_42 has joined #ocaml
<pippijn> what type does Branch expect?
answer_42 has quit [Client Quit]
<OCamlGuy> ('a,'a)
<pippijn> no
<pippijn> try again
answer_42 has joined #ocaml
<OCamlGuy> ('a * 'a) tree
<pippijn> right
<pippijn> can you give an example of an expression of this type?
<OCamlGuy> Branch(Leaf(1), Leaf(2))
<pippijn> what type does Leaf 1 have?
<OCamlGuy> int tree
<pippijn> so what is the type of (Leaf 1, Leaf 2)?
<OCamlGuy> int tree * int tree
<pippijn> but Branch expects ('a * 'a) tree
<OCamlGuy> thats a problem
<pippijn> can you give an example of an int tree?
<OCamlGuy> Leaf(1)
<OCamlGuy> so should i have like a helper function
<pippijn> okay, now one for (int * int) tree
<OCamlGuy> Branch(1,2)?
<pippijn> you said "Leaf (1) : int tree"
<pippijn> now make one for "(int * int) tree"
<OCamlGuy> I'm not sure how to
<pippijn> okay
<pippijn> so give me an example of (int * int)
<OCamlGuy> (1,2)
<pippijn> so int is 1, (int * int) is (1, 2)
<pippijn> int tree is Leaf 1
<pippijn> what is (int * int) tree?
<OCamlGuy> Leaf(1,2)
<pippijn> okay
<pippijn> so you have an example for (int * int) tree
<pippijn> and Branch expects ('a * 'a) tree
<OCamlGuy> hmm
<pippijn> so to make a Branch, you can pass that (int * int) tree you just made
<OCamlGuy> i guess it just looked weird
<pippijn> so can you make an example of a Branch?
<OCamlGuy> Branch(Leaf(2,3))
<pippijn> yes
<pippijn> your type definition does not allow arbitrary depth
<OCamlGuy> why not?
<pippijn> I'm done, you should go experiment more
<pippijn> try the ocaml toplevel
<pippijn> it prints types and values
<OCamlGuy> thanks
avsm1 has joined #ocaml
mfp has quit [Ping timeout: 246 seconds]
avsm has quit [Ping timeout: 246 seconds]
<OCamlGuy> pippijn: isn't "Branch(Leaf((3,4),(5,6)));; " an extra depth?
<pippijn> OCamlGuy: yes, it's arbitrary but defined at compile time
<pippijn> you don't need to wrap a variant around tha
<pippijn> ((3,4),(5,6)) is already a tree
Yoric has joined #ocaml
<nicoo> OCamlGuy: Think of it this way : a depth n tree will have type (int * .... * int) tree
<nicoo> Shouldn't it have type int tree, regardless of depth ?
<pippijn> nicoo: almost right
<nicoo> pippijn: I didn't look at his type definition
<nicoo> :)
<nicoo> And it's too damn early here
<nicoo> The big effing fireball has yet to appear in the sky.
<pippijn> it will be something like (int * (int * (int * (int * ...))))
<pippijn> actually that one is a list
<nicoo> Yes, indeed.
<nicoo> A « list »
<pippijn> but the same thing, but in tree-form
mfp has joined #ocaml
<nicoo> Hmm, used a trick like that recently to write a type-safe interpreter, of type 'a expr -> 'a, with de Bruijn indices.
<OCamlGuy> pippijn: thanks again
<OCamlGuy> your help was much appreciated
ulfdoz has joined #ocaml
answer_42 has quit [Quit: WeeChat 0.3.9]
aod has quit [Read error: Operation timed out]
chambart has joined #ocaml
ulfdoz has quit [Ping timeout: 260 seconds]
aod has joined #ocaml
OCamlGuy has quit [Quit: OCamlGuy]
avsm1 has quit [Quit: Leaving.]
OCamlGuy has joined #ocaml
aod has quit [Ping timeout: 246 seconds]
avsm has joined #ocaml
thebifnif has joined #ocaml
avsm has quit [Client Quit]
thebifnif has quit [Quit: Leaving]
fraggle_laptop has quit [Ping timeout: 276 seconds]
ftrvxmtrx has quit [Quit: Leaving]
OCamlGuy has quit [Quit: OCamlGuy]
rixed has joined #ocaml
Obfuscate has quit [Read error: Operation timed out]
Obfuscate has joined #ocaml
cago has joined #ocaml
Snark has joined #ocaml
hkBst has joined #ocaml
hkBst has quit [Changing host]
hkBst has joined #ocaml
answer_42 has joined #ocaml
sepp2k has joined #ocaml
jbrown__ has quit [Read error: Operation timed out]
jbrown__ has joined #ocaml
ftrvxmtrx has joined #ocaml
mnabil has joined #ocaml
chambart has quit [Ping timeout: 252 seconds]
GnomeStoleMyBike has joined #ocaml
answer_42 has quit [Ping timeout: 265 seconds]
andreypopp has joined #ocaml
fraggle_laptop has joined #ocaml
ontologiae has joined #ocaml
mfp has quit [Read error: Connection reset by peer]
Kakadu has joined #ocaml
ker2x has joined #ocaml
<ker2x> meep
<ker2x> i have a question : let hello () = print_endline "Hello" <- what does () mean please ?
cago has quit [Ping timeout: 260 seconds]
aod has joined #ocaml
<ker2x> it's a shortcut for let hello (a: unit) = print_endline "Hello";;
<ker2x> ?
<Kakadu> without () it will be not a function
<ker2x> haaaa
<Kakadu> and it will be evaluated immidiately
<ker2x> yes, i tried without () too
mfp has joined #ocaml
<Kakadu> type unit has only one sitizen in it: it is ()
<Kakadu> that's why `a:unit` is equal to `_:unit` as like as `()`
<Kakadu> I'm not very sure about term `citizen`. It is literal translation from my language
<Kakadu> I hope you've understanded
<ker2x> _ is "ignored anything" like erlang ?
<Kakadu> any value, yes
<ker2x> i think i understood, thank you
cago has joined #ocaml
<ker2x> so what is the value of hello in "let hello = print_endline "Hello";;" ? the value returned by print_endline which is "unit" ?
<ker2x> mmm, i think it is
<ker2x> # (hello);;
<ker2x> - : unit = ()
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
djcoin has joined #ocaml
trotro has joined #ocaml
<trotro> r
mcclurmc is now known as mcclurmc_away
trotro has quit [Quit: Leaving]
Neros has joined #ocaml
answer_42 has joined #ocaml
ben_zen has quit [Read error: Operation timed out]
Neros_ has joined #ocaml
Neros has quit [Ping timeout: 260 seconds]
_andre has joined #ocaml
ben_zen has joined #ocaml
beginner42 has joined #ocaml
<beginner42> is it possible with zarith, to create an n bit long number with initial values 0?
xavierm02 has joined #ocaml
Neros_ has quit [Ping timeout: 252 seconds]
ben_zen has quit [Ping timeout: 255 seconds]
ben_zen has joined #ocaml
mcclurmc_away has quit [Excess Flood]
Vinnipeg has quit [Quit: Leaving.]
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
Progster has joined #ocaml
Progster has quit [Ping timeout: 255 seconds]
Neros has joined #ocaml
ollehar has joined #ocaml
Neros has quit [Ping timeout: 260 seconds]
<Kakadu> very interesting. Why debian has i386 version of libbitstring-ocaml but amd64 don't?
<jbrown__> you don't want to use the version of bitstring in current debian anyway, it's buggy.
<jbrown__> at least it was last time I checked
<Kakadu> jbrown__: I've cloned trunk of xcp-xapi and it fails to build because bitstring package is not found
<Kakadu> So I should get this lib someway
<jbrown__> what's missing exactly? You want the 32-bit version of a library on a 64-bit OS?
<jbrown__> why?
<jbrown__> what does "apt-get build-dep xcp-xapi" say?
<Kakadu> mmm
<Kakadu> I can successfully build xapi from wheezy
<Kakadu> but now I wnat to build more late version
<Kakadu> and is says that Package `bitstring' not found
<Kakadu> searching bitstring in aptitude gives only i386 versions of libbitstring-ocaml(-dev)
<Kakadu> pffff
<Kakadu> fixed
<Kakadu> after `aptitude update` I can see needed versions
<ansx_> is there any plan to make ocaml support multi-threading, ever?
<Kakadu> ansx_: yeah
<flux> well, there is ocaml4multicore, but for some reason these kind of projects don't seem to have a lot of staying power.
paolooo has joined #ocaml
<ansx_> Kakadu: "yeah" ? which means?
<ansx_> because it seems that most code in ocaml is not reentrant
<rixed> ansx_: OCaml already support multithreading. But not concurrent threads.
<Kakadu> ansx_: ocp have mentioned that they work on it
<rixed> ansx_: or more exactly, there can be only one OCaml GC concurrently. you can have concurrent threads in C along with a thread in Ocaml.
<ansx_> yeah so Ocaml doesn't support threading...
<jbrown__> ansx_: why do you want threading? :-)
<jbrown__> programming's hard enough as it is!
<jbrown__> heh
<ker2x> ^^
<ansx_> saying that a langage supports threading as long as you don't use it but a C extension instead is pretty much a religious preach
<ansx_> jbrown__: because I we have many cores available in any recent computer
<ansx_> -I
<ker2x> well, erlang, fortran, have super-easy multithreading capabilities
<ker2x> almost seamless
<ansx_> so doing stuff on only one core at a given time is like bleeding money
<ansx_> at least F# does support threads
mjonsson has joined #ocaml
<ker2x> i tought there was jocaml or something like that ?
<ker2x> JoCaml is Objective Caml plus (&) the join calculus, that is, OCaml extended for concurrent and distributed programming.
<companion_cube> ansx_: you can do multi-process if you really need
<rixed> ansx_: no there are several purpose of threading: having several threads to simplify a program (OCaml support this) and having two simultaneous code path (Ocaml does not support this)
<rixed> ansx_: you can do multiprograming with OCaml on your many cores, just use different processes (ie. different GC).
<rixed> ansx_: look for msg passing or distributed map for a hint
joewilliams has quit [Remote host closed the connection]
lopex has quit [Read error: Connection reset by peer]
bobry has quit [Remote host closed the connection]
lopex has joined #ocaml
OCamlGuy has joined #ocaml
joewilliams has joined #ocaml
mjonsson has quit [Remote host closed the connection]
bddn has quit [Ping timeout: 244 seconds]
<ansx_> how are you supposed to interface OCaml with syscalls that may return values greater than max_int?
<adrien> Int64?
<ansx_> but then you can't use any of the "readable" arithmetics like "a + b" right?
<ansx_> you would need to use Int64.add a b
<f[x]> yes
<adrien> you can still do local redefining
smondet has joined #ocaml
<ker2x> can someone tell me (basically) what it means ? i don't understand this syntax : let binop_precedence:(char, int) Hashtbl.t = Hashtbl.create 10
<ker2x> it create a hastable of char/int ?
<thizanne> no
<thizanne> I guess it creates a hashtable with char keys and int values
<thizanne> do you use batteries ?
<rixed> is it the ":" that troubles you ?
<ker2x> yup
<jbrown__> it's just like "let x:int = 5"
<rixed> binop_precedence:type is a type indication : binop_precedence is going to be of type "type".
<rixed> type inference makes these indication mostly useless, except to find out why the compiler doesn't infer the same types as you do :)
<ker2x> mmmmmmmmm
<ker2x> haaaaaa it's a tuples ?
<rixed> "(char, int) Hashtbl.t" is the type of hashtables from char to int (char keys, int values)
<ker2x> ok "Hashtbl.t" is a type. so "binop_precedence" is a variable of type "Hashtbl.t"
<rixed> in general, hashtables have type ('a, 'b) Hashtbl.t
<rixed> "Hashtbl.t" is a type with two parameters, here char and int.
<rixed> If you know C++ it's like template parameters.
<ker2x> i think i understood it enough to keep reading the code. thank you :))
OCamlGuy has quit [Quit: OCamlGuy]
Neros has joined #ocaml
Neros has quit [Read error: Operation timed out]
<ker2x> agh
bobry has joined #ocaml
<ker2x> the type indication is "(char, int) Hashtbl.t", not just "(char, int)"
<ker2x> it like "int list" (for a list of int)
<ker2x> correct ?
Neros has joined #ocaml
Vinnipeg has joined #ocaml
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
<rixed> ker2x: correct
<Qrntz> ker2x, the general type for a list of values, «'a list», has one type parameter «'a»
<Qrntz> the general type for a hash table, «('a, 'b) Hashtbl.t», has two type parameters «'a» and «'b»
<ker2x> got it, thank you. it was mostly a syntax problem. 1) i forgot that "a:b" is to tell that a is of type b. 2) i was used to see ( ) around type indication like a:(b). 3) i forgot that a type could be not just "b" but "b something".
<ker2x> like int list :)
<ker2x> not that hard actually, using some help :)
<ker2x> thank you again
<Qrntz> also, remember that there's a difference between e. g. «('a, b')» and «'a * 'b» in type declarations
<Qrntz> the former is a 2-tuple of type parameters which are 'a and 'b, the latter is the actual type of a 2-tuple value of types 'a and 'b
<thizanne> (and this definitely sucks)
* Qrntz shrugs
<ker2x> nope, i don't understand :(
<ker2x> i didn't finished all tutorial yet. i'll see that later, hopefully.
bddn has joined #ocaml
andreypopp has quit [Quit: sleep]
<thizanne> ker2x: ('a, 'b) Hashtbl.t means hash table from 'a to 'b
<thizanne> ('a * 'b) list means list of tuples, these tuples being couples of 'a and 'b
<thizanne> in haskell, ('a, 'b) t would be something like T a b
<thizanne> and ('a * 'b) t would be T (a, b)
andreypopp has joined #ocaml
andreypopp has quit [Client Quit]
<thelema_> beginner42: I don't think zarith is a bit-vector library, but the integer 0 may suffice for your purposes.
Neros has quit [Ping timeout: 268 seconds]
hkBst has quit [Ping timeout: 272 seconds]
maufred has quit [Ping timeout: 245 seconds]
maufred has joined #ocaml
hkBst has joined #ocaml
hkBst has quit [Changing host]
hkBst has joined #ocaml
Neros has joined #ocaml
Neros_ has joined #ocaml
Neros has quit [Ping timeout: 276 seconds]
jamii has joined #ocaml
tac has joined #ocaml
OCamlGuy has joined #ocaml
avsm has joined #ocaml
Vinnipeg has quit [Quit: Leaving.]
tufisi has joined #ocaml
Neros_ has quit [Ping timeout: 268 seconds]
jbrown__ is now known as |jbrown|
<Ptivalien> python has lambdas
<Ptivalien> oh well
<Ptivalien> should have scrolled down
<companion_cube> python has poor lambdas
<companion_cube> I think it's been said :)
ftrvxmtrx has quit [Quit: Leaving]
<_habnabit> nah, its lambdas are fine
<_habnabit> if you want to complain about something, complain that python has a separation between expressions and statements
<_habnabit> lambdas are orthogonal to that
<companion_cube> it's not orthogonal, since lambdqas are limited to expressions and most python code is statements
<companion_cube> that's this distiction that makes lambdas so useless
<companion_cube> distinction*
<_habnabit> you're looking at it the wrong way
<companion_cube> (this and the scoping by reference)
<_habnabit> if python only had expressions, you could fit as many 'statements' in a lambda as you wanted
<_habnabit> 'scoping by reference' what
<companion_cube> closures in python capture references to values rather than values
<_habnabit> that's called 'late-binding'
<companion_cube> ok, I thought late binding was used for virtual method resolution
<companion_cube> so anyway, that is an ugly semantic
tac has quit [Ping timeout: 245 seconds]
<_habnabit> fwiw you can define a function anywhere in python; using a named function instead doesn't really cause issues and python has different idioms where other languages usually have inline anonymous functions or whatever
<companion_cube> yep; that just does not fix the scoping issue, but i agree, that's better than nothing
<_habnabit> no, i'm just saying that people who yell about "python's lambdas are crippled!!" just don't realize that python has idioms that make that irrelevant
mcclurmc_away has joined #ocaml
<companion_cube> it doesn't change anything about lambda themselves
andreypopp has joined #ocaml
<_habnabit> okay??
Kakadu has quit [Quit: Konversation terminated!]
<companion_cube> you're just saying "anonymous functions suck, but you can use named functions instead" in reply to "python lacks good anonymous functions"
<_habnabit> i'm not saying they suck; i'm saying that in places where people typically reach for 'anonymous functions' in other languages, python has different idioms which don't require anonymous functions
andreypopp has quit [Client Quit]
<companion_cube> yes, idioms that are not very functional :)
hkBst has quit [Quit: Konversation terminated!]
<_habnabit> you know 'functional programming' doesn't mean 'you write a lot of functions', right?
<companion_cube> it more of an implication to me...
OCamlGuy has quit [Quit: OCamlGuy]
<companion_cube> what kind of idioms are you thinking about, actually?
andreypopp has joined #ocaml
tufisi has quit [Read error: Operation timed out]
<_habnabit> decorator syntax on named functions mainly
tufisi has joined #ocaml
<companion_cube> that's more like aspect-oriented...
avsm has quit [Quit: Leaving.]
<pippijn> how can I find out whether ocaml found a function to be tail recursive?
<_habnabit> pippijn, it's in the .annot file
<pippijn> ah
cago has quit [Quit: Leaving.]
<adrien> it is? :o
<adrien> \o/
<_habnabit> yeah
<pippijn> call( tail
<pippijn> )
<pippijn> nice
<_habnabit> should make tuareg-mode show it
andreypopp has quit [Quit: sleep]
ollehar has quit [Ping timeout: 252 seconds]
<pippijn> the dcmm output doesn't show it
<_habnabit> dcmm?
Vinnipeg has joined #ocaml
bddn has quit [Remote host closed the connection]
bddn has joined #ocaml
andreypopp has joined #ocaml
bddn has quit [Remote host closed the connection]
bddn has joined #ocaml
andreypopp has quit [Quit: sleep]
<thelema_> _habnabit: c-- is an intermediate representation in native compilation of OCaml
<thelema_> _habnabit: thus -dcmm
<_habnabit> oh, I see
mcclurmc_away is now known as mcclurmc
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
Kakadu has joined #ocaml
Submarine has joined #ocaml
ftrvxmtrx has joined #ocaml
cdidd has quit [*.net *.split]
cdidd has joined #ocaml
Vinnipeg has quit [Quit: Leaving.]
GnomeStoleMyBike has quit [Ping timeout: 256 seconds]
djcoin has quit [Quit: WeeChat 0.3.9]
tizoc has quit [Ping timeout: 246 seconds]
tizoc has joined #ocaml
djcoin has joined #ocaml
djcoin has quit [Quit: WeeChat 0.3.9]
paolooo has quit [Quit: Page closed]
mcclurmc is now known as mcclurmc_away
cdidd has quit [Read error: Operation timed out]
<madroach> hi, I have a problem with typing mutually recursive classes: http://pastebin.com/RZ7TQLyV This fails with "universal type variable 'a cannot be generalized: it escapes its scope".
<madroach> But when defining the classes without "and", but with two separate "class" statements it compiles fine. Why?
tac has joined #ocaml
<thelema_> interesting question... foo is a method that takes a value of type #a and calls #id on it.
<thelema_> is there a good reason to have the type annotation? why not just "method foo s = s#id"?
<madroach> thelema_: this doesn't work either: The method foo has type (< id : 'a; .. > as 'b) -> 'a where 'b is unbound.
<thelema_> ah, yes.
sepp2k1 has joined #ocaml
<thelema_> you do need the 'a. to force polymorphism. hmm, I'm not sure why typing is going a bit weird in the recursive case.
<thelema_> I imagine there's some obscure way to break type-safety through this, but I can't think of what it would be.
<madroach> What I actually want to do is this: http://pastebin.com/d4VAbdX0
<thelema_> ah, that explains the recursion
sepp2k has quit [Ping timeout: 244 seconds]
<thelema_> class a = object end and b = object method foo: 'a. (#a as 'a) -> int = fun s -> 3 end;;
<thelema_> # Error: The universal type variable 'a cannot be generalized: it escapes its scope.
<thelema_> maybe it's not allowed for some reason to have polymorphic methods within recursive declaration?
<thelema_> well, one solution should be to add some type parameters to your classes
<thelema_> # class a = object end and ['a] b = object method foo: (#a as 'a) -> int = fun s -> 3 end;;
<thelema_> class a : object end
<thelema_> and ['a] b : object constraint 'a = #a method foo : 'a -> int end
<madroach> thelema_: Yes, I read that. But I don't like the type parameters.
<thelema_> maybe something about how the types aren't fully defined, so the #a fails...
<thelema_> hmm...
<thelema_> I'd raise this issue on the mailing list; it may be a place where the type inference can be improved
<thelema_> otherwise jacques garrigue will construct the exact example to show why this is not allowed.
<madroach> thelema_: ok. I'll post this question. Which mailing list do you mean?
<thelema_> caml-list
<madroach> thelema_: thanks a lot for your input !! :)
<thelema_> madroach: you're welcome.
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
Vinnipeg has joined #ocaml
tane has joined #ocaml
metadave has quit [Read error: Connection reset by peer]
Vinnipeg has quit [Client Quit]
sepp2k1 has quit [Quit: Leaving.]
sepp2k has joined #ocaml
mnabil has quit [Read error: Operation timed out]
jamii has quit [Ping timeout: 240 seconds]
jamii has joined #ocaml
GnomeStoleMyBike has joined #ocaml
mnabil has joined #ocaml
emmanuelux has joined #ocaml
andreypopp has joined #ocaml
Anarchos has joined #ocaml
metadave has joined #ocaml
Neros has joined #ocaml
andreypopp has quit [Quit: sleep]
Neros has quit [Ping timeout: 260 seconds]
andreypopp has joined #ocaml
ontologiae has quit [Ping timeout: 248 seconds]
OCamlGuy has joined #ocaml
Neros has joined #ocaml
chambart has joined #ocaml
OCamlGuy has quit [Read error: Connection reset by peer]
Anarchos has quit [Ping timeout: 276 seconds]
tac has quit [Ping timeout: 245 seconds]
Anarchos has joined #ocaml
_andre has quit [Quit: leaving]
CmrPantoufle has joined #ocaml
tac has joined #ocaml
mnabil has quit [Ping timeout: 276 seconds]
answer_42 has quit [Ping timeout: 276 seconds]
tbrady has joined #ocaml
Yoric has quit [Remote host closed the connection]
Yoric has joined #ocaml
chambart has quit [Read error: Connection reset by peer]
andreypopp has quit [Read error: Connection reset by peer]
Snark has quit [Quit: Quitte]
avsm has joined #ocaml
Yoric has quit [Ping timeout: 240 seconds]
BiDOrD has quit [Read error: Operation timed out]
BiDOrD has joined #ocaml
xavierm02 has quit [Quit: Leaving]
Yoric has joined #ocaml
Yoric has quit [Ping timeout: 245 seconds]
beginner42 has quit [Quit: irc2go]
tane has quit [Quit: Verlassend]
Yoric has joined #ocaml
Yoric has quit [Ping timeout: 255 seconds]
Kakadu has quit [Quit: Konversation terminated!]
sepp2k has quit [Remote host closed the connection]
Vinnipeg has joined #ocaml
Vinnipeg has quit [Client Quit]
Yoric has joined #ocaml
smondet has quit [Ping timeout: 246 seconds]
mjonsson has joined #ocaml
jamii has quit [Ping timeout: 260 seconds]
seanmcl has quit [Quit: Leaving.]
tbrady has quit [Quit: Leaving.]
Anarchos has quit [Quit: Vision[0.9.7-H-090423]: i've been blurred!]
GnomeStoleMyBike has quit [Ping timeout: 244 seconds]
madroach has quit [Ping timeout: 244 seconds]
arneis has joined #ocaml
tufisi has quit [Ping timeout: 264 seconds]
emmanuelux has quit [Remote host closed the connection]
arneis has quit [Ping timeout: 245 seconds]
cdidd has joined #ocaml
tac-tics has joined #ocaml
ninegrid has left #ocaml []
jamii has joined #ocaml