dylan changed the topic of #ocaml to: OCaml 3.09.1 available! Archive of Caml Weekly News: http://sardes.inrialpes.fr/~aschmitt/cwn/ | A free book: http://cristal.inria.fr/~remy/cours/appsem/ | Mailing List: http://caml.inria.fr/bin/wilma/caml-list/ | Cookbook: http://pleac.sourceforge.net/
clog has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
Snark has joined #ocaml
Skal has quit [Read error: 110 (Connection timed out)]
pango_ has quit ["Client exiting"]
sieni has joined #ocaml
<sieni> Hi all,
<sieni> is there a list of all platforms supported by the ocaml native code compiler and runtime?
pango has joined #ocaml
<sieni> found already
sieni has left #ocaml []
Raziel has joined #ocaml
Raziel has quit ["Yo soy goma. Tú eres cola."]
Raziel has joined #ocaml
Raziel has quit [Read error: 104 (Connection reset by peer)]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
SnarkBoojum has joined #ocaml
vodka-goo has joined #ocaml
Snark has quit [Read error: 110 (Connection timed out)]
Revision17 has quit [Read error: 110 (Connection timed out)]
SnarkBoojum is now known as Snark
vodka-goo has quit ["Connection reset by by pear"]
vodka-goo has joined #ocaml
ramkrsna has quit [Connection timed out]
ramkrsna has joined #ocaml
vodka-goo has quit [Remote closed the connection]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
Raziel has joined #ocaml
tristram has quit [Read error: 104 (Connection reset by peer)]
tristram has joined #ocaml
Raziel has quit [Read error: 104 (Connection reset by peer)]
Raziel has joined #ocaml
_JusSx_ has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
Mozillion has joined #ocaml
batdog is now known as batdog|gone
<kryptt> how do I compare 2 references?
<kryptt> (as if they were pointers)
<zmdkrbou> with = :D
<flux__> I think you can only compare for physical equality, but with ==
<flux__> oh, you maybe want to compare their contents for physical equality
<kryptt> hmmm,
<kryptt> no i wanted to compare they pointed at the same place
<zmdkrbou> when i declare a and then b = ref a and c = ref a, i have b = c
<zmdkrbou> hmmm, actually this does not compare as you want
<flux__> let a = ref 0 in let b = a in let c = ref 0 in !a == !b, !a == !c should produce true, false?
<zmdkrbou> kryptt: what do you want to test exactly ?
<kryptt> zmdkrbou: hmm, i can make in work in an example; but not my code
<kryptt> zmdkrbou: i supose i should be more precise on the tpypes at least:
<kryptt> type mstate = TopState
<kryptt> | MachineState of (mstate * (event -> unit))
<kryptt> then im trying to compare two r ef mstate types
<kryptt> type event = Enter | Exit | Init | UserEvent of int
<kryptt> and mstate = TopState
<kryptt> | MachineState of (mstate * (event -> unit));;
ramki has joined #ocaml
ramkrsna has quit [Connection timed out]
<zmdkrbou> kryptt: if you have a and b refs like this, why don't you use !a == !b ?
<kryptt> let me see
<kryptt> hmm, :) that was it
<kryptt> i haven't written much in OCaML sorry
<kryptt> thanx
Smerdyakov has joined #ocaml
twobitsprite has joined #ocaml
<twobitsprite> I just wish ocaml had more introspection...
<twobitsprite> i.e. if I have a type with lots of variations, i.e. "type foo = Lots | Of | Variations | ..." and I wanted to select one of those variations randomly I can't just "let x = select_random_from_list foo.variations_list"
ramki is now known as rk_afk
<dylan> heh...
<dylan> 10:16 <@Boert> Dylan: To me, ocaml syntax looks like perl crossed with java.
<Smerdyakov> twobitsprite, I bet you can implement that with camlp4.
<twobitsprite> camlp4 scares me
<twobitsprite> I dunno... I guess I'm just looking for a more rapid-prototype style language, with all of the ocaml features :P
<twobitsprite> I want python-meets-ocaml
<flux__> maybe a generic from_int to_int for such variants already exists?
<flux__> but, if it's for testing or you can otherwise do dirty tricks, there's Obj.magic ;)
<twobitsprite> what's that?
<flux__> it allows typecasting. bad stuff happens if you use it wrong.
<twobitsprite> I see
khaladan has quit [" HydraIRC -> http://www.hydrairc.com <- Go on, try it!"]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
batdog|gone is now known as batdog
batdog is now known as batdog|gone
lispy` has quit [Remote closed the connection]
lispy has joined #ocaml
Mozillion has quit ["Client exiting"]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
<lispy> did you guys know that haskell is ahead of ocaml on the great pl shootout these days?
<lispy> in memory use, run time and lines of code
<Smerdyakov> But SML is the clear overall winner, to me.
<Smerdyakov> It's really impressive that SML comes out ahead for tiny benchmarks.
<dylan> but ocaml has a nicer syntax than SML.
<Smerdyakov> It would definitely kick OCaml's ass for real programs, since MLton is an actual optimizing compiler that can do cross-module optimizations.
<Smerdyakov> dylan, I don't agree.
<dylan> Smerdyakov: niceness is a matter of perspective.
<lispy> but SML is way behind ocaml which is behind haskell
<Smerdyakov> dylan, sure. Look at the efficiency of programmers well versed in the languages. I assert that the OCaml/SML syntax differences don't have an effect there.
<Smerdyakov> lispy, what? SML is the top compiler PERIOD if you weight run time 1, lines of code 1, and memory usage 0.
<Smerdyakov> Er, _MLTon_ is.
<dylan> I should have used the predicate "I wish SML an option for me, but I am very much liking the ocaml syntax"
<lispy> Smerdyakov: not on my screen, if i use the weight you talk about i see, gcc, D, haskell as the top 3
<Smerdyakov> lispy, which platform's figures are you using?
descender has joined #ocaml
<Smerdyakov> lispy, OK. My figure was for Debian, which is what I use.
<lispy> i can use tinyurl on that if you want
<Smerdyakov> lispy, you've linked Gentoo results.
<lispy> well, i don't think they update the debian ones anymore
<lispy> didn't change much
<Smerdyakov> lispy, where is there information on what they update and what they don't?
zigong has joined #ocaml
<lispy> i don't remember now, i've been following a thread on a maillist about the shootout, maybe someone there mentioned it
<lispy> i think they have some forums too
<Smerdyakov> Why do they favor Gentoo?
Saulzar has joined #ocaml
<lispy> i think the thing i read basically said they are using the gentoo system for the new benchmarks
<lispy> but, actually i see some of the new ones on the debian side
<lispy> hmm..interesting, they are using different versions of compilers on the gentoo machine
Raziel has quit ["Yo soy goma. Tú eres cola."]
<Smerdyakov> Well, our united conclusion should be that statically typed functional programming languages have several extremely competitive implementations now.
<Smerdyakov> And that it would be great to have benchmarks on non-trivial programs, to allow opportunities for global optimization to show.
<lispy> actually, i'd say it means that haskell and languages in the ML family can be competitive, but it comes down to who is writing the code and how much time they put into it
<Smerdyakov> Right; the benchmarks don't measure development time directly.
<Smerdyakov> But I'd conjecture that experienced developers in those languages take low development time as well.
Bigb[a]ng is now known as Bigbang
zigong has quit [SendQ exceeded]
zigong has joined #ocaml
|Lupin| has joined #ocaml
<|Lupin|> Hello, guys.
<|Lupin|> Someone knows if there is a way to pass arguments to an ocamlyacc-generated parser, please ?
<|Lupin|> Apart from using references...
khaladan has joined #ocaml
mak1 has joined #ocaml
|Lupin| has left #ocaml []
mak1 has left #ocaml []
__DL__ has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
zigong has quit [SendQ exceeded]
zigong has joined #ocaml
Saulzar has left #ocaml []
demitar_ is now known as Demitar
slipstream has quit [Read error: 104 (Connection reset by peer)]
malc_ has joined #ocaml
slipstream has joined #ocaml
zigong has quit [SendQ exceeded]
zigong has joined #ocaml
pango has quit ["Leaving"]
pango has joined #ocaml
ski has joined #ocaml
kryptt has left #ocaml []
zigong has quit [SendQ exceeded]
zigong has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
ski_ has joined #ocaml
ski has quit [Nick collision from services.]
ski_ is now known as ski
zigong has quit [SendQ exceeded]
zigong has joined #ocaml
__DL__ has quit [Remote closed the connection]
__DL__ has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
franka has joined #ocaml
<franka> Hello, all.
vodka-goo has joined #ocaml
Revision17 has joined #ocaml
franka has quit []
<flux__> hmh.. too bad mottl didn't answer to my bug report of sexplib being incompatible with camlp4o, now I may have to dig in myself :-o
Revision17 has quit ["Leaving"]
Schmurtz has joined #ocaml
Raziel has joined #ocaml
srle has joined #ocaml
<srle> Hi, All.
<srle> How can I define priority of new operators? Example: let (+++) a b = a + 2 * b;;
<srle> I want that (+++) is highest priority
<srle> Something like in Haskell: infix 4 (+++)
<dylan> srle: ocaml operators have the precedense of their first character.
<vodka-goo> srle: the priority depends on the first symbol
<vodka-goo> but I don't know where to find exactly the highest one..
srle has quit ["BitchX: the ONLY IRC client on Viagra!"]
Submarine has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
<flux__> I worked around my problem with sexplib with perl -i -pe 's/pr_dump.cmo/pr_o.cmo/g' /usr/lib/ocaml/3.09.0/METAS/META.camlp4, but I don't think it's such a great idea
<flux__> oh well, will work for the time being
_JusSx_ has quit ["leaving"]
Snark has quit ["Leaving"]
demitar_ has joined #ocaml
vodka-goo has quit ["Connection reset by by pear"]
noj has quit [Read error: 110 (Connection timed out)]
zigong has quit ["using sirc version 2.211+KSIRC/1.3.12"]
Demitar has quit [Read error: 110 (Connection timed out)]
gim has joined #ocaml
Bigbang is now known as Bigb[a]ng
MisterC has quit ["Client exiting"]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
Raziel has quit ["Yo soy goma. Tú eres cola."]
Raziel has joined #ocaml
__DL__ has quit ["Bye Bye"]
gim has quit ["zzzz"]
tristram has quit [Remote closed the connection]
tristram has joined #ocaml
rillig_ has joined #ocaml
tristram has quit [Read error: 104 (Connection reset by peer)]
tristram has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
Raziel has quit ["Yo soy goma. Tú eres cola."]
Raziel has joined #ocaml
prower has joined #ocaml
prower has quit [Remote closed the connection]
neilc has joined #ocaml
<neilc> ocamlc -c parser.mli
<neilc> File "parser.mli", line 13, characters 48-54:
<neilc> Unbound type constructor Expr.t
<neilc> (that is after running ocamlyacc and ocamllex successfully, with a reasonable ocamllex input file i haven't shown)
<neilc> what am i doing wrong?
<zmdkrbou> neilc: did you compiled expr.ml before that ?
<neilc> zmdkrbou: the definition at the top of parser.mly should be enough, shouldn't it?
<zmdkrbou> if you're using Expr.t, you need to have expr.ml compiled
<neilc> doesn't the definition (Module Expr = ...) at the top of parser.mly suffice?
<zmdkrbou> aah
Raziel has quit ["Yo soy goma. Tú eres cola."]
<zmdkrbou> if there's a module definition for Expr in parser.mly ... then it's ok
<zmdkrbou> mmmh
<zmdkrbou> what is the declaration for Expr.t ?
<zmdkrbou> and how do you use it ?
<neilc> the def'n begins at line 8 of the rafb.net paste (http://rafb.net/paste/results/fZuu3933.html)
<neilc> the use it seems to object to is line 28
<zmdkrbou> hmm
* zmdkrbou doesn't understand
* zmdkrbou doesn't know if it's because he's drunk or because the compiler is dumb
<neilc> heh, yeah, i'm obviously doing something wrong, i can't see what it is tho
rillig_ has quit ["exit(EXIT_SUCCESS)"]
<malc_> neilc: .mli depends on Expr.t which is only defined in .ml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
khaladan_ has joined #ocaml
Raziel has joined #ocaml
khaladan has quit [Read error: 110 (Connection timed out)]
khaladan_ is now known as khaladan
Raziel has quit ["Yo soy goma. Tú eres cola."]
malc_ has quit ["leaving"]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
khaladan has quit [Read error: 104 (Connection reset by peer)]
pango_ has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
pango has quit [Read error: 110 (Connection timed out)]
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
mauke has quit [Read error: 104 (Connection reset by peer)]
mauke has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml
rk_afk is now known as ramkrsna
Smerdyakov has quit ["Leaving"]
Smerdyakov has joined #ocaml
mauke has quit [Remote closed the connection]
mauke has joined #ocaml