mbishop changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/ | Grab OCaml 3.10.2 from http://caml.inria.fr/ocaml/release.html (featuring new camlp4 and more!)
hkBst has quit ["Konversation terminated!"]
mbishop has quit [Nick collision from services.]
mbishop_ is now known as mbishop
coucou747 has quit [Remote closed the connection]
coucou747 has joined #ocaml
ikaros has quit ["segfault"]
bluestorm_ has quit ["Konversation terminated!"]
AxleLonghorn has joined #ocaml
AxleLonghorn has left #ocaml []
Chile` has quit [Remote closed the connection]
yminsky_ has quit [Read error: 110 (Connection timed out)]
naufraghi has joined #ocaml
yminsky_ has joined #ocaml
xnuntius_ has quit ["Fui embora"]
naufraghi has quit []
coucou747 has quit ["bye ca veut dire tchao en anglais"]
coucou747 has joined #ocaml
evn has joined #ocaml
jlouis has quit [Read error: 110 (Connection timed out)]
AxleLonghorn has joined #ocaml
AxleLonghorn has left #ocaml []
yminsky_ has quit []
szell has quit [Connection timed out]
Optikal_ has quit ["Leaving."]
m3ga has quit ["disappearing into the sunset"]
alexyk has joined #ocaml
alexyk has quit []
coucou747 has quit ["bye ca veut dire tchao en anglais"]
szell has joined #ocaml
Demitar has quit [Read error: 110 (Connection timed out)]
evn has quit []
netx has joined #ocaml
robozni has quit [Remote closed the connection]
adu has joined #ocaml
Mr_Awesome has quit ["aunt jemima is the devil!"]
adu has left #ocaml []
Mr_Awesome has joined #ocaml
alexyk has joined #ocaml
Mr_Awesome has quit [Remote closed the connection]
Mr_Awesome has joined #ocaml
Mr_Awesome has quit [Remote closed the connection]
hehe has joined #ocaml
comglz has joined #ocaml
naufraghi has joined #ocaml
jarimatti has joined #ocaml
hehe has left #ocaml []
hkBst has joined #ocaml
bluestorm has joined #ocaml
yangsx has quit [Read error: 110 (Connection timed out)]
Maddas has joined #ocaml
alexyk has quit []
alexyk has joined #ocaml
comglz has quit ["Lost terminal"]
ikaros has joined #ocaml
alexyk has quit []
jeremiah has quit [Read error: 104 (Connection reset by peer)]
mqtt has joined #ocaml
jeremiah has joined #ocaml
mikeX_ is now known as mikeX
det has quit [Read error: 104 (Connection reset by peer)]
det has joined #ocaml
Linktim has joined #ocaml
jarimatti has quit []
yminsky_ has joined #ocaml
coucou747 has joined #ocaml
Yoric[DT] has joined #ocaml
<Yoric[DT]> hi
jlouis has joined #ocaml
jlouis has quit [Remote closed the connection]
yminsky_ has quit []
yminsky_ has joined #ocaml
Linktim has quit [Read error: 110 (Connection timed out)]
Linktim has joined #ocaml
Snark has joined #ocaml
Linktim_ has joined #ocaml
hehe has joined #ocaml
Anarchos has joined #ocaml
<Anarchos> i made too much modif to a source tree. How to get the clean copy from the cvs repository ?
Linktim_ has quit [Remote closed the connection]
<flux> I haven't used cvs for times, but simply removing the modified files and cvs updating should do it
<Anarchos> hmm seems too intricated since i made lots of modifs in lots of dirs
<flux> well, you could just remove the whole tree and cvs update -d it
<flux> or you could cvs update | some magic here to remove the modified files
<flux> or you could do cvs diff -u | patch -R
<flux> maybe cvs has cvs revert too, I don't remember
<qwr> rm -rf `ls | grep -v CVS` && cvs up -d
Linktim_ has joined #ocaml
<bluestorm> Yoric[DT]: did you plan something wrt. Core ?
Linktim has quit [Read error: 110 (Connection timed out)]
<Anarchos> qwr i have simpler : cvs up -C :)
* qwr has been too long on linux channels... looking that shell line it seems obvious how convinient would be to replace | with / ;)
<qwr> Anarchos: hmm, yes :)
Anarchos has quit ["Vision[0.8.5-0418]: i've been blurred!"]
ikaros has quit [Read error: 104 (Connection reset by peer)]
structured has joined #ocaml
Torment has joined #ocaml
ikaros has joined #ocaml
Jedai has quit [Read error: 110 (Connection timed out)]
<Yoric[DT]> bluestorm: not yet.
<Yoric[DT]> I've very quickly looked at Core and most of what's "new-but-applicable-to-everyone" in core looks quite similar to ExtLib.
<Yoric[DT]> Perhaps it's even ExtLib.
<bluestorm> the test methodology looks interesting
<orbitz> how so?
Mr_Awesome has joined #ocaml
<bluestorm> orbitz: i think it's good practice to have an extensive set of tests if you want to experiment with several versions of a given function
<bluestorm> btw, Extlib has tests too
<orbitz> oh i thought you were saying there is somethign unique and interesting about the Core tests
<bluestorm> hm
<bluestorm> sorry :]
Linktim- has joined #ocaml
coucou747 has quit ["bye ca veut dire tchao en anglais"]
<structured> I am so intimidated by starting a large scale project in ocaml...so many ways to go about generality..
<bluestorm> "generality" ?
coucou747 has joined #ocaml
<structured> err how to generically write pieces of code and leverage features of ocaml
<orbitz> meh, just start writing and be ready to refactor
<structured> orbitz: that's the plan...reviewing the language until my 2nd job end and I have time to start coding
Linktim_ has quit [Read error: 110 (Connection timed out)]
<orbitz> structured: that's teh sissy mans route
<orbitz> are you a sissy?
<structured> well I don't even remember the syntax for 1/3 of the cool stuff in ocaml..so going to "sandbox" my ocaml work until I am comfortable with it again
<orbitz> just make simple stuff that' wha ti did
<orbitz> i rewrote some of my helper pythong scripts
<structured> orbitz: cool...well I will get started soon..possibly next weekend. I also need to decide what repository to put it on :|
<orbitz> subversion?
<structured> orbitz: no, where..not what
<orbitz> id on't follow?
<orbitz> like sourceforge?
<structured> orbitz: yeah exactly..and need to contemplate license..but these aren't ocaml matters
<orbitz> don't get ahead of yoruself. nobody is going to want to use your ocaml programs for some tiem now
<structured> orbitz: yeah I want the repository for myself...and if you use sourceforge, you've commited yourself to a license before you have a code base
* orbitz just runs subversion ocally
<structured> one problem at a time..gotta run. thanks for advice
coucou747 has quit [Remote closed the connection]
coucou747 has joined #ocaml
Linktim_ has joined #ocaml
coucou747 has quit [Remote closed the connection]
Mr_Awesome has quit ["aunt jemima is the devil!"]
Linktim- has quit [Read error: 110 (Connection timed out)]
coucou747 has joined #ocaml
jonafan_ has joined #ocaml
filp has joined #ocaml
hehe has left #ocaml []
hehe has joined #ocaml
<flux> wow, godi makes it really easy to switch to HEAD (well, still compiling, but looks promising ;-))
<flux> (I want to try yout natlink)
jonafan has quit [Read error: 110 (Connection timed out)]
<flux> hj
<flux> whops
<flux> where can I find the svn repository for godi_console? I'm thinking from somewhere here: https://godirepo.camlcity.org/openapps/svnindex.cgi but I don't know where..
<flux> sigh, godi upgrade didn't go as smoothly as I hoped - out of disk space on my laptop..
<orbitz> i blame godi for that
<flux> well, I hope 200M more space will be sufficient
<flux> off to sauna ->
naufraghi has quit []
LordMetroid has joined #ocaml
AxleLonghorn has joined #ocaml
AxleLonghorn has left #ocaml []
Linktim- has joined #ocaml
<flux> and no, things didn't go smoothly.. labltk has a failing patch, and lablgl depends on it (and I want lablgl)
Linktim_ has quit [Read error: 110 (Connection timed out)]
evn has joined #ocaml
<flux> darn, ocamlnat is not built by default, nor is it planned to be delivered by default
evn has left #ocaml []
jdroid- has joined #ocaml
hehe has left #ocaml []
palomer has quit [Remote closed the connection]
<flux> also, ocamlnat itself doesn't appear to work very smoothly..
^authentic has joined #ocaml
jdroid- has quit ["leaving"]
comglz has joined #ocaml
authentic has quit [Connection timed out]
^authentic is now known as authentic
<hcarty> flux: What problems are you having with ocamlnat? (just curious...)
<hcarty> I have found it slower for very simple things (print_endline "Howdy!") because the compilation takes longer, but much faster for anything math-intensive.
<hcarty> flux: Also curious - How did you compile ocamlnat from godi?
<flux> after installing it, I manually entered the build directory, built it so far that I could build ocamlnat, did that and copied the ocamlnat binary ;)
<flux> hcarty, my first issue was with topfind
<flux> understandable
<flux> the second issue was that there is no ocamlmktopnat (or is there?)
<flux> and the third one was that I wasn't able to load sdl properly into the toplevel
<flux> certain c symbols couldn't be found
<hcarty> I imagine a lot of build systems will have to be reconfigured to produce .cmxs files once 3.11 is officially out
Linktim- has quit [Remote closed the connection]
<flux> in any case, interesting stuff
<hcarty> It is too bad that they are not planning to deliver it by default
<flux> I wonder why. not ready for mainstream yet?
<flux> even nicer would be if the systems were able to load mixed byte/native code :)
<hcarty> Probably - they may just wait a release or two for the natdynlink bugs to settle out
<hcarty> That would be quite handy :-)
<flux> I was writing a game that involved flying, and took a detour at generating a proper sound for the vehicle.. but to be real time something like natdynlink and especially natdynlink MetaOCaml would rock.
<flux> well, it's real time now, but not probably when there is a more complicated synthesizer
Snark has quit ["Ex-Chat"]
jlouis has joined #ocaml
evn has joined #ocaml
alexyk has joined #ocaml
<coucou747> orage KTHXBYE
coucou747 has quit ["bye ca veut dire tchao en anglais"]
alexyk has quit []
Yoric[DT] has quit ["Ex-Chat"]
alexyk has joined #ocaml
alexyk has quit [Client Quit]
alexyk has joined #ocaml
netx has quit [Read error: 110 (Connection timed out)]
jlouis has quit [Read error: 110 (Connection timed out)]
sd_ has joined #ocaml
evn has quit []
jlouis has joined #ocaml
AxleLonghorn has joined #ocaml
AxleLonghorn has left #ocaml []
smimou has quit ["bli"]
smimou has joined #ocaml
sd_ has quit []
naufraghi has joined #ocaml
yminsky_ has quit []
filp has quit ["Bye"]
al-maisan has joined #ocaml
<al-maisan> Hello there!
<structured> oy
alexyk has quit []
<al-maisan> I have a problem I don't understand .. I am prepending to a list as follows:
<al-maisan> (c, s, t)::acc
naufraghi has quit []
<al-maisan> and get the following compile time error
<al-maisan> This expression has type string * string * string but is here used with type
<al-maisan> 'a list
<bluestorm> guess your code is wrong somewhere
<al-maisan> OK
<jlouis> it must be unable to unify 'a with string * string * string
<bluestorm> for example, the "acc" variable may be given a wrong value
<bluestorm> think of a failed function call for example
<bluestorm> can you show more code al-maisan ?
<al-maisan> just a sec
<bluestorm> you can paste it at http://pastebin.be for example
<al-maisan> bluestorm: the code is here http://hrnjad.net/src/q/parse_data.ml.html
<al-maisan> line 32 is the offending line ..
<bluestorm> how do you call that function ?
<al-maisan> BTW, what I am trying to parse is http://hrnjad.net/src/q/test.results
<bluestorm> aaah
<bluestorm> simple
<bluestorm> parse in_file cmd size (c, s, t)::acc => parse in_file cmd size ((c, s, t) :: acc )
<al-maisan> bluestorm: let me try.
<bluestorm> btw, your function as-is is not tail-recursive
<al-maisan> bluestorm: the complete code is here http://hrnjad.net/src/q/parse_data.ml.complete.html
<al-maisan> bluestorm: why is it not tail recursive?
<bluestorm> because of the try .. with
<al-maisan> Ah, I see..
<bluestorm> let rec read acc = try let line = read_line () in read (line :: acc) with End_of_file -> [] is not tail-recursive
<bluestorm> let rec read acc = let line = try Some (read_line ()) with End_of_file -> None in match line None -> [] | str -> read (str :: acc)
<bluestorm> is tail-recursive
<bluestorm> +with
<bluestorm> match line with None -> [] | Some str -> read (str :: acc)
<al-maisan> interesting ..
<al-maisan> thanks for the advice .. will try to refactor the code accordingly ..
<al-maisan> thanks and good bye!
al-maisan has quit ["Leaving."]
ikaros has quit ["segfault"]
<TychoBrahe> noz vat
naufraghi has joined #ocaml
netx has joined #ocaml
bluestorm has quit ["Konversation terminated!"]
LordMetroid has quit ["Leaving"]
comglz has quit ["bonne nuit all"]
shortcircuit has quit [Connection timed out]
shortcircuit has joined #ocaml
coucou747 has joined #ocaml
yangsx has joined #ocaml
alexyk has joined #ocaml
naufraghi has quit []
yminsky_ has joined #ocaml
ozzloy has quit ["leaving"]
ozzloy has joined #ocaml
alexyk has quit []
hkBst has quit ["Konversation terminated!"]