sponge45 changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/
mnemonic has quit ["leaving"]
malc_ has quit ["leaving"]
smimou has quit ["bli"]
<mbishop> Hmm, I still wonder sometimes...should I prefer SML or OCaml?
<pantsd> go with whichever gets you more ladies/gentlemen :)
<mbishop> Java? :P
<pantsd> oh sad :(
<mbishop> That'd get me more money, which would get me more ladies...but I wouldn't be happy
<pantsd> I'm not sure about that, like you could become a professor using your mad SML skills and then get all of the frosh ladies in your introduction to CS or similar :)
<pantsd> but then you would go to jail :(
<mbishop> Really though, seems like OCaml has more going for it currently than SML, but SML seems really nice (at least in some regards...certain points of ocaml are nicer)
<Smerdyakov> mbishop, are all of the differences that matter to you included on my comparison page? http://www.cs.berkeley.edu/~adamc/mlcomp/
<Submarine> Smerdyakov, yow
<mbishop> Smerdyakov: hmm yes, most of them
<Smerdyakov> Submarine, come again?
<Smerdyakov> mbishop, if I missed anything at all, I'd like to hear about it.
* Submarine at ucsc
<Smerdyakov> Submarine, "yow" was a generic greeting? :)
* Submarine pinhead
<mbishop> Is Successor ML still alive?
shawn has joined #ocaml
<mbishop> Does Jon Harrop ever come to this channel?
<mbishop> I was just wondering if he ever plans on making his book free, at some point in the future
<Smerdyakov> Hardly any well-known OCaml people come here. :(
Submarine has quit [Remote closed the connection]
<mbishop> Smerdyakov: You're a well-known ocaml person...at least well known, heh
<mbishop> I heard/read about you in #haskell and #scheme
<Smerdyakov> How is that?
<Smerdyakov> See, that's the wrong kind of notoriety to be looking for in participants. :D
<mbishop> :)
mbishop has quit [Read error: 104 (Connection reset by peer)]
shawn has quit ["This computer has gone to sleep"]
rillig has quit ["exit(EXIT_SUCCESS)"]
threeve has joined #ocaml
mbishop has joined #ocaml
threeve has quit []
Smerdyakov has quit ["Leaving"]
ramkrsna has joined #ocaml
pango has quit [Remote closed the connection]
pango has joined #ocaml
bhauth has joined #ocaml
johnnowak has joined #ocaml
<bhauth> So you recommend that book on Self?
chi11 has joined #ocaml
johnnowak_ has joined #ocaml
<johnnowak_> lousy client -- missing a discussion about Self!
johnnowak has quit [Nick collision from services.]
johnnowak_ is now known as johnnowak
diffbavis has quit [Read error: 104 (Connection reset by peer)]
johnnowak_ has joined #ocaml
johnnowak_ has quit [Client Quit]
johnnowak has quit [Read error: 110 (Connection timed out)]
love-pingoo has joined #ocaml
bhauth has left #ocaml []
bluestorm has joined #ocaml
pants1 has joined #ocaml
pantsd has quit [Read error: 110 (Connection timed out)]
velco has joined #ocaml
joshcryer has quit [Connection timed out]
pango has quit [Remote closed the connection]
smimou has joined #ocaml
pango has joined #ocaml
mnemonic has joined #ocaml
<mnemonic> hi
<love-pingoo> hi
ikaros has quit [Read error: 110 (Connection timed out)]
ikaros has joined #ocaml
pango has quit [Remote closed the connection]
pango has joined #ocaml
slipstream-- has quit [Read error: 110 (Connection timed out)]
slipstream has joined #ocaml
diffbavis has joined #ocaml
ramkrsna has quit [Read error: 104 (Connection reset by peer)]
ramkrsna has joined #ocaml
descender has joined #ocaml
shawn has joined #ocaml
descender has quit ["Elegance has the disadvantage that hard work is needed to achieve it and a good education to appreciate it. - E. W. Dijkstra"]
descender has joined #ocaml
ramkrsna has quit [Read error: 104 (Connection reset by peer)]
ramkrsna has joined #ocaml
ramkrsna has quit [Read error: 104 (Connection reset by peer)]
ramkrsna has joined #ocaml
swater has joined #ocaml
postalchris has joined #ocaml
pango has quit [Remote closed the connection]
shawn has quit ["This computer has gone to sleep"]
shawn has joined #ocaml
shawn has quit [Remote closed the connection]
gim has quit [Remote closed the connection]
levi_home has quit [Read error: 104 (Connection reset by peer)]
Smerdyakov has joined #ocaml
velco has quit ["<boris``> reduction ad absurdum is a fallacious method of proof"]
shawn has joined #ocaml
shawn has quit [Client Quit]
shawn has joined #ocaml
diffbavis has quit [Read error: 104 (Connection reset by peer)]
shawn has quit [Client Quit]
shawn has joined #ocaml
diffbavis has joined #ocaml
chi11 has quit ["I'm outta here ..."]
Submarine has joined #ocaml
shawn has quit ["This computer has gone to sleep"]
shawn has joined #ocaml
shawn has quit ["This computer has gone to sleep"]
pango has joined #ocaml
shawn has joined #ocaml
torper has joined #ocaml
diffbavis has quit [Read error: 104 (Connection reset by peer)]
oracle1 has joined #ocaml
<oracle1> hi. Could there be a reason why some floating point functions work in the toplevel but return 0.0 with exactly the same arguments while being compiled?
<oracle1> copy&paste of the arguments between toplevel and compiled code
<oracle1> with no variables or side effects
<flux-> is it a function that is very volatile to rounding?
<flux-> hm, maybe volatile isn't the proper word, "sensitive" maybe
<oracle1> the value which the toplevel returns is 1/(2^32) .. so yes.
<flux-> maybe optimizations affect
<oracle1> so it might get rounded to 0 ? that would be odd no...
<flux-> compiled = byte code compiled or natively compiled?
<oracle1> tried byte code
<oracle1> and native
<oracle1> both same result
<flux-> is the piece of code long?
<oracle1> no
<flux-> maybe you could put it to a paste site
<oracle1> i can paste it to a paste bin
<oracle1> if you call searchqInUkq with
<oracle1> # searchqInUkq 32.0 32.0 0.0 0.5 0.001;;
<oracle1> - : float = 2.32830643653869629e-10
<oracle1> #
<oracle1> that should be the compiled result, but its 0.0
<flux-> how do you output the result?
<oracle1> oh dear
<flux-> ;-)
<oracle1> thats a good quesiton
<oracle1> that's it
<oracle1> embarassing :)
<oracle1> i just used %f
<oracle1> thanks heh
<oracle1> can I represent that somehow with a formatting directive?
<flux-> I don't know, but print_float works
<flux-> or string_of_int
<flux-> uh, string_of_float
<oracle1> yeah that could do ..
mnemonic has quit ["leaving"]
<oracle1> ok thanks alot
<oracle1> hm
levi_home has joined #ocaml
<bluestorm> do you know LLVM ( http://llvm.org/ ) ?
<bluestorm> (do you think it would be suitable as a Ocaml backend ?)
shawn has quit ["This computer has gone to sleep"]
<zmdkrbou> bluestorm: there was the idea of an ocaml front-end for llvm on the google soc page of the website. so yes, probably
<bluestorm> hm
shawn has joined #ocaml
shawn has quit [Remote closed the connection]
shawn has joined #ocaml
shawn has quit [Remote closed the connection]
shawn has joined #ocaml
benny has joined #ocaml
<flux-> hm, would such a project entail more than writing a new, llvm-generating, backend to ocaml?
benny_ has quit [Read error: 110 (Connection timed out)]
shawn__ has joined #ocaml
shawn has quit [No route to host]
shawn__ has quit ["This computer has gone to sleep"]
shawn has joined #ocaml
as has joined #ocaml
as has quit [Read error: 104 (Connection reset by peer)]
malc_ has joined #ocaml
shawn has left #ocaml []
diffbavis has joined #ocaml
malc_ has quit [Read error: 110 (Connection timed out)]
<flux-> I've got a module that I use in another project, I've made a ocamlfind-library out of it
<flux-> how would I use ocamlfind to generate me a toplevel that reveals the symbols properly?
<flux-> ocamlfind ocamlmktop will generate me a toplevel, but if I get a value of some type defined in the module linked in by ocamlfind, the type appears abstract
<flux-> and hence I can do nothing with it
<flux-> similarly the modules appear 'invisible'
<flux-> in my test code I have let gfx = new Gfx.t ()
<flux-> and from toplevel I can see the value gfx is of type Gfx.t, abstract (which isn't quite true, as it is an object with methods which I should be able to see also)
<flux-> module G = Gfx;; says Unbound module Gfx
<flux-> I could always use #use "topfind";; #require "myPackage" but it is my experience it loads another copy or something, the global values the modules might have aren't shared properly.. (or am I simply misinterpreting things and this is how it should be done?)
<flux-> hm, actually I tried that last approach again and I'm getting some success ;), but is there any other way?
jacobian has joined #ocaml
Submarine has quit ["Leaving"]
<hcarty> Is there much or any performance hit when using records rather than, say, tuples to pass data around?
<postalchris> Does anyone know if the plain-old equals operator ( = ) works for Gmp.Z.t?
<flux-> I believe tuples and records are represented the same way, with the exception of tuples that contain only floats
<postalchris> I mean, it seems to, but can I count on it?
<flux-> refer to the manual for details (the section that describes how to interface with C)
<postalchris> I got burned by Big_int.
<hcarty> flux-: Ok, thanks
<flux-> postalchris, hm, isn't it very likely that Gmp.Z.t is an opaque datatype, and its equals-operator would be provided by the C-library.. I don't really know how the polymorphic equality operator works, though
<flux-> normal ocaml-code can't provide its own equality comparison though?
<flux-> how does that stuff even work? is there a map of tags and their associated comparison functions?
<postalchris> The quality operator seems to "do the right thing" in trivial examples, though.
<postalchris> Whereas if you to "big_int0 = big_int1" you get an exception
<flux-> apparently if a block has a custom tag, it can somehow be assigned a comparison function
<flux-> but the interface apparently is for C only, judging from the calling convention..
<flux-> there is struct custom_operations in custom.h which allows setting comparison, hashing, serialization, deserialization and finalization functions for a custom block..
<flux-> so: a c-library could do the right thing, whereas it is difficult for Big_int, which I believe is an ocaml-library.. not very fair, imo ;)
<postalchris> Huh.
<postalchris> That is weird!
malc_ has joined #ocaml
<tsuyoshi> hcarty: tuples and records are identical during runtime
<tsuyoshi> although = won't tell you that, obviously...
<Smerdyakov> Maybe it would if you asked it nicely.
<tsuyoshi> maybe
postalchris has quit [Read error: 110 (Connection timed out)]
mnemonic has joined #ocaml
torper has left #ocaml []
ikaros has quit ["Leaving"]
shawn has joined #ocaml
love-pingoo has quit ["Connection reset by pear"]