flux__ changed the topic of #ocaml to: OCaml 3.09.2 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/
khaladan has joined #ocaml
zedrdave has quit []
khaladan has quit [Read error: 104 (Connection reset by peer)]
chessguy has joined #ocaml
shawn has quit ["This computer has gone to sleep"]
joshcryer has joined #ocaml
chessguy has quit [" HydraIRC -> http://www.hydrairc.com <- 100,000+ downloads can't be wrong"]
exa has quit [Read error: 110 (Connection timed out)]
Amorphous has quit [Read error: 110 (Connection timed out)]
Amorphous has joined #ocaml
shawn has joined #ocaml
khaladan has joined #ocaml
paf has joined #ocaml
Smerdyakov has quit ["Leaving"]
jcreigh has joined #ocaml
exa has joined #ocaml
jcreigh has quit ["Do androids dream of electric sheep?"]
Skal has joined #ocaml
zedrdave has joined #ocaml
love-pingoo has joined #ocaml
paf has quit [herbert.freenode.net irc.freenode.net]
ppsmimou has quit [herbert.freenode.net irc.freenode.net]
mlh has quit [herbert.freenode.net irc.freenode.net]
Amorphous has quit [herbert.freenode.net irc.freenode.net]
mellum has quit [herbert.freenode.net irc.freenode.net]
avlondono has quit [herbert.freenode.net irc.freenode.net]
Skal has quit [herbert.freenode.net irc.freenode.net]
exa has quit [herbert.freenode.net irc.freenode.net]
shrimpx has quit [herbert.freenode.net irc.freenode.net]
illya23b has quit [herbert.freenode.net irc.freenode.net]
danly has quit [herbert.freenode.net irc.freenode.net]
rossberg has quit [herbert.freenode.net irc.freenode.net]
Revision17 has quit [herbert.freenode.net irc.freenode.net]
ramkrsna has quit [herbert.freenode.net irc.freenode.net]
sieni has quit [herbert.freenode.net irc.freenode.net]
CLxyz has quit [herbert.freenode.net irc.freenode.net]
dvekravy has quit [herbert.freenode.net irc.freenode.net]
khaladan has quit [herbert.freenode.net irc.freenode.net]
joshcryer has quit [herbert.freenode.net irc.freenode.net]
teop has quit [herbert.freenode.net irc.freenode.net]
gim has quit [herbert.freenode.net irc.freenode.net]
ski has quit [herbert.freenode.net irc.freenode.net]
Schmurtz has quit [herbert.freenode.net irc.freenode.net]
zmdkrbou has quit [herbert.freenode.net irc.freenode.net]
chimikal has quit [herbert.freenode.net irc.freenode.net]
Lob-Sogular has quit [herbert.freenode.net irc.freenode.net]
Skal has joined #ocaml
exa has joined #ocaml
paf has joined #ocaml
khaladan has joined #ocaml
Amorphous has joined #ocaml
joshcryer has joined #ocaml
teop has joined #ocaml
ppsmimou has joined #ocaml
gim has joined #ocaml
ski has joined #ocaml
Schmurtz has joined #ocaml
zmdkrbou has joined #ocaml
Revision17 has joined #ocaml
ramkrsna has joined #ocaml
Lob-Sogular has joined #ocaml
chimikal has joined #ocaml
sieni has joined #ocaml
rossberg has joined #ocaml
mlh has joined #ocaml
avlondono has joined #ocaml
dvekravy has joined #ocaml
illya23b has joined #ocaml
CLxyz has joined #ocaml
danly has joined #ocaml
shrimpx has joined #ocaml
mellum has joined #ocaml
zedrdave has quit [Read error: 104 (Connection reset by peer)]
zedrdave has joined #ocaml
joshcryer has quit [Client Quit]
love-pingoo has quit ["Connection reset by by pear"]
teop has quit ["Leaving"]
clog has joined #ocaml
exa has quit [Remote closed the connection]
finelemo1 has joined #ocaml
andreas_1 has joined #ocaml
finelemon has quit [Read error: 110 (Connection timed out)]
andreas_1 has quit []
ketty has joined #ocaml
andreas_1 has joined #ocaml
andreas_1 has quit []
andreas_1 has joined #ocaml
mikeX has joined #ocaml
Demitar has joined #ocaml
Amorphous has quit [Read error: 110 (Connection timed out)]
Amorphous has joined #ocaml
andreas_1 has quit []
andreas_1 has joined #ocaml
chessguy has joined #ocaml
paf has left #ocaml []
Smerdyakov has joined #ocaml
khaladan has quit [Read error: 104 (Connection reset by peer)]
andreas_1 has quit []
love-pingoo has quit ["Leaving"]
piggybox has left #ocaml []
chessguy has quit [" HydraIRC -> http://www.hydrairc.com <- 100,000+ downloads can't be wrong"]
<mikeX> can't I have empty actions in ocamlyacc?
<dylan> They need to return some value.
<dylan> could be (), I suppose. But I'm not sure how that could be useful
<mikeX> I'm not sure I understand, I'm trying to write something like (expr)*
<mikeX> in bison, you would make another rule, which was nothing | expr that_rule
<dylan> like, a list of exprs?
<dylan> you'd need to use a list. :)
* mikeX really confused
<dylan> list: { [] } | expr list { $1 :: $2 }
<dylan> ;
<mikeX> do I have to specify { } ?
<dylan> yes, otherwise ocaml would have no idea what you're talking about
<mikeX> that's not necessary in bison, right?
<dylan> no, but in bison you usually rely on side effects a lot more.
* dylan just realized he spent all night writing an ocaml interface to a md5 hashing function in C, only to discover the Digest module.
<mikeX> hmm, I see, I was trying to avoid semantic actions for the time being
<mikeX> hahaha
<dylan> semantic actions?
<mikeX> yes, the ones enclosed in { }
<dylan> they'er required.
<dylan> I think
<dylan> usually, one's actions usually just return one's AST.
<mikeX> yes
<dylan> (or an intermediate parse tree, depending)
<mikeX> but I only have to write the parser at the moment, not build the ast
<dylan> the two are rather tightly linked,
<mikeX> that worked with bison (tried this assignment in C last year)
<dylan> I would think.
<dylan> well, you could just make every action be { () }
<mikeX> I guess, ok I'll try that, thanks dylan
<dylan> n/p.
<mikeX> on other thing, rule: symbol | symbol is different from rule: | symbol | symbol, right?
<mikeX> ulinke ocaml's pattern matching
<mikeX> unlike*
<dylan> Yes.
Amorphous has quit [Connection timed out]
<dylan> foo: | matches nothing.
<mikeX> ok, just making sure :)
Amorphous has joined #ocaml
<mikeX> a bit OT, but anyone knows how to make omake *not* print those annoying info?
__DL__ has joined #ocaml
Amorphous has quit [Read error: 110 (Connection timed out)]
Amorphous has joined #ocaml
<Demitar> mikeX: -s and -S respectively (depending on what behaviour you want).
<mikeX> well I wasn't talking about that exactly, but about omake's own output
<mikeX> it's really annoying
<mikeX> *** omake: reading OMakefiles
<mikeX> *** omake: finished reading OMakefiles (0.0 sec)
<mikeX> who cares!
<Demitar> You can always omake |grep -v "*** omake:" :)
<mikeX> I guess that's one way to work around it, but omake devs should consider a --quiet flag :)
<Demitar> Out of curiousity when is that actually annoying?
<mikeX> it clutter's the output, and I'm having trouble making out what's really going on
<mikeX> clutters*
<mikeX> if things go as planned (the makefile was read) there's no nead to tell me. unix programs usually work this way, and for a good reason :)
<Demitar> Does it print that per-directory, or when does it become clutter. I'm usually more concerned with there being too much error output. :)
<mikeX> well I just started using omake, and i'm building a very simple project, hold on
<mikeX> I don't know about you, but I find it a bit hard to locate the error there
<mikeX> (at first glance)
<mikeX> are you an omake developer Demitar ?
<Demitar> And how often are the makerules themselves borken? ;-) Of course, when writing ocaml code I always let emacs find the actual error locations for me so it's not an issue on ocaml errors.
<Demitar> mikeX: No, just an omake user. :)
<mikeX> i see, I didn't get that about the makerules
<Demitar> Good thing, because it was only me mis-parsing your error output. :)
<mikeX> oh :)
<mikeX> well no wonder, with all that useless info :P
<Demitar> (I've never liked yacc in the first place of course. So I can't vouch for the errors. :)
khaladan has joined #ocaml
<mikeX> well the errors are there, the line number is wrong since the error is detected late, but that's not too much of a problem
<mikeX> and what do you prefer instead of yacc?
<Demitar> I'm of the school that LALR rots the brain. ;-)
<mikeX> hahah :)
love-pingoo has joined #ocaml
smimou has joined #ocaml
JKnecht is now known as Lycurgus_
pango is now known as pangoafk
pangoafk is now known as pango
_JusSx_ has joined #ocaml
khaladan has quit [Success]
kral has joined #ocaml
khaladan has joined #ocaml
exa has joined #ocaml
zedrdave has joined #ocaml
kral has quit [""I'll say it again. In the land of the free, use your freedom of choice.""]
teop has joined #ocaml
mikeX_ has joined #ocaml
Smerdyakov has quit ["Leaving"]
mikeX has quit [Nick collision from services.]
mikeX_ is now known as mikeX
<_JusSx_> gperf for ocaml?
zedrdave has left #ocaml []
__DL__ has quit [Remote closed the connection]
_JusSx_ has quit ["leaving"]
exa has quit [Remote closed the connection]
noc has joined #ocaml
<noc> hello
<ketty> hello
<noc> I have a small problem with functor
<ketty> yes?
<noc> I want to write a functor with multipl args but I can't find the syntax.
<noc> I have try this : module DTW = functor ( Tab : Array_sig, Num : Math.Number.Number_sig, Data : Distance_sig ) ->
<noc> But this don't work.
<mikeX> noc: same as function syntax I think
<mikeX> which means, skip the commas, and fix your parentheses
love-pingoo has quit ["Connection reset by by pear"]
<ketty> mikeX: i think that functors are ment to have ugly parentheses...
<mikeX> hmm, let's see
<noc> I have try the function syntaxe, and this is no more good.
<mikeX> that's what I meant
<mikeX> module Name (Name1 : signature1 ) ...( Namen : signaturen ) = structure
<mikeX> just like functions
<ketty> ahh..
<noc> thx
<ketty> its the functor application that is ugly, right?
<noc> Thank you two .
<mikeX> module Name = functor ( structure1 ) ...( structuren )
<mikeX> that's the application form, I'm not too familiar with functors though
<ketty> i the comparison between normal and revised ocaml syntax...
<ketty> there is this example: type t = Set.Make(M).t;; vs. type t = (Set.Make M).t;
<mikeX> both forms are part of ocaml's syntactic sugar btw, not the barebone ones
<mikeX> yeah that looks ugly ketty, either way
revision17_ has quit ["Ex-Chat"]
Revision17 has joined #ocaml
noc has quit ["((Obj.magic (()))^"a");;"]
Revision17 has quit ["Ex-Chat"]
Smerdyakov has joined #ocaml
mikeX has quit ["zzz"]
smimou has quit ["bli"]