mbishop changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/ | Grab Ocaml 3.10.0 from http://caml.inria.fr/ocaml/release.html (featuring new camlp4 and more!)
G_ has quit [Read error: 110 (Connection timed out)]
ita is now known as ita|zzz
ita|zzz has quit [Remote closed the connection]
piggybox has joined #ocaml
piggybox_ has quit [Connection timed out]
piggybox_ has joined #ocaml
<fremo> mwc: I should have it, do you still need it ?
piggybox has quit [Connection timed out]
<mwc> fremo: sorta
<mwc> I end a match with: | _ -> failwith "..." and get an unsound type warning
<mwc> I just coerced it: (failwith "..." : unit)
<mwc> but before, I figured out a smarter way to solve it
aij has quit [Read error: 104 (Connection reset by peer)]
aij has joined #ocaml
seafoodX has joined #ocaml
<fremo> 18:55 < mwc> anyhoo, I replaced that ugly case with a pair of pattern guarded ones, | Some foo,Some _ when foo <> ... -> failwith "..." | S
<fremo> ome _,Some bar when bar <> ... -> failwith "..." | _ -> failwith "..."
<mwc> fremo: thanks!
seafoodX has quit []
<fremo> easy :)
seafoodX has joined #ocaml
<fremo> I dont get it, but it is 3am...
buluca has quit [Read error: 113 (No route to host)]
crabstick_ has joined #ocaml
schme` has joined #ocaml
piggybox has joined #ocaml
mav has quit [Read error: 113 (No route to host)]
seafoodX has quit []
piggybox_ has quit [Connection timed out]
crabstick has quit [Read error: 110 (Connection timed out)]
piggybox_ has joined #ocaml
schme has quit [Success]
piggybox has quit [Nick collision from services.]
piggybox_ is now known as piggybox
piggybox_ has joined #ocaml
szsz has quit ["Leaving."]
Smerdyakov has quit ["Leaving"]
piggybox has quit [Connection timed out]
piggybox has joined #ocaml
piggybox_ has quit [Connection timed out]
piggybox_ has joined #ocaml
piggybox has quit [Connection timed out]
piggybox has joined #ocaml
szsz has joined #ocaml
piggybox_ has quit [Read error: 110 (Connection timed out)]
piggybox_ has joined #ocaml
piggybox has quit [Connection timed out]
piggybox has joined #ocaml
piggybox_ has quit [Connection timed out]
bluestorm_ has joined #ocaml
piggybox_ has joined #ocaml
piggybox has quit [Read error: 110 (Connection timed out)]
ygrek has joined #ocaml
seafoodX has joined #ocaml
piggybox__ has joined #ocaml
ALZ has joined #ocaml
szsz has quit ["Leaving."]
buluca has joined #ocaml
piggybox_ has quit [Read error: 110 (Connection timed out)]
szsz has joined #ocaml
ALZ has quit []
crabstick_ has quit [Read error: 110 (Connection timed out)]
piggybox_ has joined #ocaml
jlouis has quit [Connection timed out]
piggybox__ has quit [Read error: 110 (Connection timed out)]
piggybox__ has joined #ocaml
piggybox_ has quit [Read error: 110 (Connection timed out)]
ktne has joined #ocaml
<ktne> hello
oracle1 has quit ["leaving"]
<szsz> /search lpc
ygrek has quit [Remote closed the connection]
G has joined #ocaml
Demitar has quit [Read error: 113 (No route to host)]
Tetsuo has joined #ocaml
mwc has quit ["Lost terminal"]
dmentre has joined #ocaml
rum_e_pera_ has joined #ocaml
<rum_e_pera_> hi
<rum_e_pera_> where can I found a good and quick manual for ocaml
<rum_e_pera_> ?
<ktne> on p2p :)
<rum_e_pera_> with notions of denotational semantics and operational one
<rum_e_pera_> ok :))
<rum_e_pera_> but
<rum_e_pera_> what's its name?
<rwmjones> look at http://ocaml-tutorial.org/ and the links from there
<rum_e_pera_> thanks ))
<ktne> where is the tutorial for programmers?
<bluestorm_> hm
<ktne> Learning OCaml, for C, C++, Perl and Java programmers
<ktne> that's what i think it's recommended but i can't find it
<bluestorm_> if you're into theory
<bluestorm_> http://caml.inria.fr/pub/docs/u3-ocaml/index.html could be a good choice rum_e_pera_
<rum_e_pera_> thank you very much :))
rwmjones has left #ocaml []
ktne has quit []
Cygal has joined #ocaml
Cygal has quit [Client Quit]
Cygal has joined #ocaml
piggybox has joined #ocaml
seafoodX has quit []
piggybox__ has quit [Connection timed out]
G_ has joined #ocaml
G has quit [Read error: 110 (Connection timed out)]
love-pingoo has joined #ocaml
love-pingoo has quit [Read error: 104 (Connection reset by peer)]
mrpingoo has joined #ocaml
szsz has quit ["Leaving."]
szsz has joined #ocaml
mr_hugo has joined #ocaml
<mr_hugo> hello
m3ga has joined #ocaml
rum_e_pera_ has quit [Read error: 110 (Connection timed out)]
G_ has quit [Read error: 110 (Connection timed out)]
buluca has quit [Read error: 113 (No route to host)]
m3ga has quit ["disappearing into the sunset"]
mrpingoo has quit ["Connection reset by pear"]
Tortugo has quit [Read error: 104 (Connection reset by peer)]
pantsd has quit [Remote closed the connection]
ygrek has joined #ocaml
ita has joined #ocaml
ygrek has quit [Remote closed the connection]
buluca has joined #ocaml
|Jedai| has joined #ocaml
jedai has quit [Read error: 110 (Connection timed out)]
crathman has joined #ocaml
ppsmimram has joined #ocaml
ppsmimou has quit [Read error: 110 (Connection timed out)]
Smerdyakov has joined #ocaml
ppsmimram has quit [Remote closed the connection]
* Tetsuo LOL
crabstick has joined #ocaml
pango has quit [Remote closed the connection]
pango has joined #ocaml
azoic has joined #ocaml
Oatmeat|umn is now known as Oatmeat
Oatmeat has quit ["Leaving"]
Oatmeat has joined #ocaml
balbinus has joined #ocaml
<balbinus> hi everyone :)
<balbinus> I'm trying to use the Gdome libxml/libxslt bindings in a small application, and I'm having some problems with createDocumentFromMemory... it doesn't seem to be interfacing correctly with the C underlying API... has anyone run into these problems before?
<balbinus> I'm using Ubuntu Feisty's packaged version of libgdome2-ocaml
rillig has joined #ocaml
seafoodX has joined #ocaml
dmentre has left #ocaml []
seafoodX has quit []
crathman has quit ["ChatZilla 0.9.78.1 [Firefox 2.0.0.6/2007072518]"]
<grirgz> balbinus ?! kestu fou la ?
crathman has joined #ocaml
ygrek has joined #ocaml
buluca has left #ocaml []
authentic has quit [Read error: 104 (Connection reset by peer)]
authentic has joined #ocaml
pango has quit [Remote closed the connection]
pango has joined #ocaml
ygrek has quit [Remote closed the connection]
ygrek has joined #ocaml
seafoodX has joined #ocaml
jlouis has joined #ocaml
mr_hugo has left #ocaml []
ygrek has quit [Remote closed the connection]
tty56_ has joined #ocaml
tty56 has quit [Read error: 110 (Connection timed out)]
Cygal has quit [Remote closed the connection]
seafoodX has quit []
slipstream-- has joined #ocaml
Cygal has joined #ocaml
crabstick_ has joined #ocaml
olegfink has quit [Read error: 104 (Connection reset by peer)]
olegfink has joined #ocaml
slipstream has quit [Read error: 110 (Connection timed out)]
crabstick has quit [Read error: 110 (Connection timed out)]
crabstick has joined #ocaml
crabstick_ has quit [Read error: 110 (Connection timed out)]
G has joined #ocaml
_bt2 has joined #ocaml
Cygal has quit [Read error: 110 (Connection timed out)]
_bt2 has left #ocaml []
<Oatmeat> does ocaml have a built in operator like . in haskell? Basically an infix operator with type (a -> b) -> (b -> c) -> a -> c
Demitar has joined #ocaml
G_ has joined #ocaml
<bluestorm_> Oatmeat: no it doesn't
<bluestorm_> you have to add it yourself
<bluestorm_> let (@@) f g x = f (g x)
<Oatmeat> ok thanks
G has quit [Connection timed out]
<ita> bluestorm_: what an evil operator !
<bluestorm_> hm
<bluestorm_> evil ?
<ita> or funny
<bluestorm_> @@ is not that sexy but @ is in use
<ita> let (^_^) = ...
<bluestorm_> and then i can use @$ for the haskell $ and feel safe
<bluestorm_> hm
<ita> ah no, the ^ is reserved
<ita> that's a good trick
<bluestorm_> let (^-^) x = x;;
<xavierbot> val ( ^-^ ) : 'a -> 'a = <fun>
<ita> with utf8 chars imagine the party
<ita> why is ^-^ allowed and not ^_^ ?
<ita> why let (^o^) a = a does not work either ?
<Smerdyakov> 'o' is not an operator character.
<Smerdyakov> '-' is probably a special prefix character.
<Smerdyakov> All look-upable in the manual's grammar.
<ita> so i cannot mix operator chars (@ ^ $) with letters ? doh
<Smerdyakov> Do you want me to point you to the manual section that shows the exact rules? :)
<ita> im searching im searching
<ita> got it
Cygal has joined #ocaml
<piggybox> bluestorm_: lol, using emotions as operators is really creative
<bluestorm_> hm
<ita> next, the utf8 lambda
<ita> too bad ocaml does not support utf8 chars in the names
<piggybox> for something like . in haskell, I prefer F#'s idiom: let (>>) f g x = g(f(x))
<ita> does someone have an example of a y combinator in caml ? one that does not require -rectypes
<bluestorm_> hm
<bluestorm_> piggybox: why not use let (>>) x f = f x ?
<piggybox> bluestorm_: well, yours is data pipeline, not method pipeline
<bluestorm_> hm
<piggybox> both are very useful
<bluestorm_> i haven't tried either of them but it seems to me than the only difference is the place of the actual argument
<bluestorm_> parameter
<bluestorm_> and i'd say having the parameter on the left is more natural, isn't it ?
<piggybox> let (>>) f g x = g(f(x))
<piggybox> how to fire xavierbot ?
<bluestorm_> let (>>) f g x = g (f x);;
<xavierbot> val ( >> ) : ('a -> 'b) -> ('b -> 'c) -> 'a -> 'c = <fun>
<piggybox> oh, thx
<piggybox> let (|>) x f = f x ;;
<xavierbot> val ( |> ) : 'a -> ('a -> 'b) -> 'b = <fun>
<piggybox> you see the difference?
<bluestorm_> (succ >> to_string >> (^) "one =") 1;;
<xavierbot> Characters 10-19:
<xavierbot> (succ >> to_string >> (^) "one =") 1;;
<xavierbot> ^^^^^^^^^
<xavierbot> Unbound value to_string
<piggybox> one is data |> fun, another is fun >> fun
<bluestorm_> (succ >> string_of_int >> (^) "one =") 1;;
<xavierbot> - : string = "one =2"
<bluestorm_> :]
<bluestorm_> piggybox: but you can do
<bluestorm_> data >> fun >> fun >> fun
<bluestorm_> hm
<piggybox> yes
<bluestorm_> |> actually
<bluestorm_> hm
<piggybox> but sometime we just need hook up methods
<bluestorm_> it's exactly the same differance as let (@@) f g x = f (g x) and let (@$) f x = f x :p
<piggybox> btw, >> and |> show direction as well, so I prefer them
ita has quit [Remote closed the connection]
ita has joined #ocaml
skale has joined #ocaml
ednarofi has joined #ocaml
<balbinus> grirgz: je t'en pose des questions ? :)
Cygal has quit ["kthxbye"]
<grirgz> balbinus: tu fait de l'ocaml maintenant ?
bluestorm_ has quit ["Konversation terminated!"]
|Jedai| is now known as jedai
crathman has quit ["ChatZilla 0.9.78.1 [Firefox 2.0.0.6/2007072518]"]
rillig has quit ["exit(EXIT_SUCCESS)"]
skale has quit ["Leaving"]
ednarofi_ has joined #ocaml
ednarofi has quit [Read error: 110 (Connection timed out)]
jedai has quit ["KVIrc 3.2.6 Anomalies http://www.kvirc.net/"]
piggybox_ has joined #ocaml
<balbinus> grirgz: depuis qqs mois oui
<grirgz> balbinus: ca t'a pris comme ca tout a coup ?
ednarofi_ has quit ["leaving"]
<balbinus> lol
<balbinus> disons qu'on m'y a intéressé :)
<grirgz> les cours ?
<danderson> moi je sais :P
<grirgz> mon dieu, mais il y a du monde!
<ita> grirgz: tu crois ?
<balbinus> en fait c'est deux gars
<balbinus> qui s'appellent david et samuel
<balbinus> qui m'y ont forcé.
<grirgz> le flingue sur la tempe et tout :p
<ita> ouais et moi c'était véronique et davina
<balbinus> (faut pas le dire trop fort y'en a un qui est sur ce chan... l'autre est déco je pense)
<balbinus> ita: ah moi elles ont essayé de me faire utiliser java
<balbinus> grirgz: voilà
<ita> balbinus: ah tiens :-)
<grirgz> balbinus: alors t'en pense quoi de ce langage ?
<balbinus> pas facile d'approche
<balbinus> j'ose pas imaginer l'horreur à apprendre en cours
<balbinus> mais très puissant
<balbinus> très très puissant.
<balbinus> :)
<ita> balbinus: essaye avec ocaml+twt
<balbinus> essayer quoi ?
<ita> la syntaxe, c'est plus facile d'approche
<grirgz> c'est clair qu'il rox trop ce langage =)
<balbinus> ita: euh non
<grirgz> ita: c'est le truc a la python la ?
<balbinus> c'est vraiment pas la syntaxe le problème :)
<ita> balbinus: bah, si
<balbinus> et franchement je préfère la syntaxe de caml à celle de python
<balbinus> ita: pour moi non :)
<balbinus> m'enfin bon
<balbinus> je m'y suis fait
<balbinus> je suis très loin d'être un wizard en ocaml mais en 4 mois j'arrive à faire des trucs sympa :)
<balbinus> genre des trucs avec gdome /o\
<ita> url?
<balbinus> de gdome ?
<grirgz> t'a testé pxp ? c'est pas mal aussi
<balbinus> y'en a pour ainsi dire pas.
<ita> balbinus: :-/
<balbinus> grirgz: oui non mais beurk si on a inventé DOM c'est pas pour des prunes...
<balbinus> ita: oué, moi aussi
<grirgz> si tu le dit
<grirgz> enfin bon, ca se base pas mal sur dom quand meme
<balbinus> ita: enfin si, gdome doit avoir une page... mais le binding caml c'est la merde totale
<balbinus> grirgz: la question n'est pas là
<balbinus> si ça se trouve c'est vachement bien
<balbinus> mais DOM permet de passer d'un langage à un autre bcp plus facilement
<balbinus> avec les mêmes concepts, la même API, etc
<ita> bof
<ita> encore un outil de sérialization qui a mal tourné
<ita> tu prends json, ça fait pareil, en plus lisible
<balbinus> O_O
<balbinus> euuuuuh
<balbinus> je suis vraiment pas sûr qu'on parle de la même chose, les gars...
piggybox has quit [Connection timed out]
<balbinus> bon moi je suis crevé
<ita> balbinus: 36 15 rustine ?
<balbinus> je verrai demain si j'ai le courage de recompiler + patcher le binding gdome...
<balbinus> ita: recrache ce clown. tout de suite.
<ita> balbinus: eh
<balbinus> bonne nuit tout le monde
<ita> balbinus: pense à respirer
<balbinus> je vais essayer de pas oublier
<balbinus> y'a un groupe à côté de chez moi qui a sorti un disque y'a qqs années
<balbinus> qui disait « il faut que tu respires »
<balbinus> ça m'aide à pas oublier.
<balbinus> we must never forget!