gildor changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/ | OCaml 3.12.0 http://bit.ly/aNZBUp
<Associat0r> EM03: many languages
ulfdoz_ has joined #ocaml
ulfdoz has quit [Ping timeout: 264 seconds]
ulfdoz_ is now known as ulfdoz
avsm has quit [Quit: Leaving.]
lopex has quit []
dnolen has quit [Quit: dnolen]
<EM03> Associat0r: can you think of one? I'm just curious
<Associat0r> Scala / Mozart-Oz / F# / all the ML's
<Associat0r> Clean
<Associat0r> too many to count
<EM03> same family though for the most part
<EM03> well scala isn't I guess
<EM03> well its functional hmm
<Associat0r> Mozart/Oz also isn't
<EM03> hmm always wanted to check out Oz but never liked prolog really
<Associat0r> it's not Prolog
<Associat0r> it's also not about liking it
<Associat0r> it's a nice learning tool
impy has quit [Ping timeout: 255 seconds]
rwmjones has quit [Read error: Operation timed out]
khia0 has joined #ocaml
dnolen has joined #ocaml
dnolen has quit [Client Quit]
Associat0r has quit [Quit: Associat0r]
Associat0r has joined #ocaml
jamii has joined #ocaml
jamii has quit [Ping timeout: 240 seconds]
axiles has joined #ocaml
khia0 has left #ocaml []
vivanov has joined #ocaml
ygrek has joined #ocaml
philtor has quit [Read error: Operation timed out]
edwin has joined #ocaml
rwmjones has joined #ocaml
vivanov has quit [Quit: Lost terminal]
vivanov has joined #ocaml
impy has joined #ocaml
Cyanure has joined #ocaml
Snark has joined #ocaml
munga has joined #ocaml
<ski> EM03 : also Erlang
* ski idly wonders what EM03 didn't like about Prolog
munga has quit [Read error: Operation timed out]
Cyanure has quit [Remote host closed the connection]
Anarchos has joined #ocaml
lopex has joined #ocaml
<Associat0r> ski: it's a 1 trick poney
Anarchos has quit [Quit: Vision[0.9.7-H-090423]: i've been blurred!]
ygrek has quit [Ping timeout: 250 seconds]
ygrek has joined #ocaml
Associat0r has quit [Quit: Associat0r]
avsm has joined #ocaml
sepp2k has joined #ocaml
lopex has quit [Ping timeout: 240 seconds]
lopex has joined #ocaml
ikaros has joined #ocaml
yezariaely has joined #ocaml
avsm has quit [Quit: Leaving.]
Anarchos has joined #ocaml
lopex has quit []
thomasga has joined #ocaml
thomasga has quit [Client Quit]
sepp2k has quit [Ping timeout: 255 seconds]
avsm has joined #ocaml
sepp2k has joined #ocaml
<krktz> has anyone studied in Germany? i'm planning to go there, probably to Berlin, and i have a few questions about the universities :)
<EM03> ski: just the syntax honestly
joewilliams is now known as joewilliams_away
ymasory has joined #ocaml
avsm has quit [Quit: Leaving.]
mouse has joined #ocaml
<mouse> Hello. Does anyone here have experience of using camlp4 with ocamlfind+ocamlbuild?
<mouse> I have a problem with trying to use sexplib and camlp4 filters at the same time
dnolen has joined #ocaml
philtor has joined #ocaml
dnolen has quit [Client Quit]
munga has joined #ocaml
boscop has quit [Ping timeout: 255 seconds]
avsm has joined #ocaml
vivanov has quit [Ping timeout: 246 seconds]
vivanov has joined #ocaml
<gildor> mouse: what is the pb ?
<gildor> (I am using daily sexplib, camlp4, ocamlfind and ocamlbuild)
<mouse> I use sexplib to serialize AST structure in my compiler
<mouse> it compiles with the following tags:
<mouse> <**/*> : pkg_batteries, pkg_threads, pkg_sexplib.syntax, pkg_batteries.syntax, syntax_camlp4o
ftrvxmtrx has quit [Read error: Operation timed out]
<mouse> recently, I have decided to add some ast transformation routines based on camlp4 filters (map, fold)
<mouse> <**/*> : pkg_batteries, pkg_threads, pkg_sexplib.syntax, pkg_batteries.syntax, syntax_camlp4o, pp(camlp4o -filter map)
<mouse> with following tags I get an error:
<mouse> File "ast.ml", line 22, characters 38-39:
<mouse> Parse error: [semi] expected after [str_item] (in [implem])
<mouse> error occurs on the "sexp_opaque" token
<mouse> as if sexplib wasn't properly loaded into camlp4
<mouse> I also get the following warning:
<mouse> Warning: -pp overrides the effect of -syntax partly
ftrvxmtrx has joined #ocaml
<mouse> gildor, the problem is: how to combine sexplib and camlp4 filters
<mouse> ocamlbuild drives me nuts :-)
<avsm> been looking at lwt vs delimcc recently; any comments are welcome… http://www.openmirage.org/wiki/delimcc-vs-lwt
<NaCl> gildor: oh, I should probably file a bug report about this (when I get around to it), but the locale installer stuff in oasis doesn't honor the DESTDIR variable
boscop has joined #ocaml
Anarchos has quit [Remote host closed the connection]
yezariaely has quit [Quit: Leaving.]
<gildor> mouse: pp(...) override ocamlfind settings
<mouse> ok. I shouldn't use pp() then
<gildor> mouse: you'll have to edit myocamlbuid.ml to add syntax_camlp4o_map tag and add -ppopt
<mouse> hmm. will try now
<gildor> mouse: stop, there is something more simple
<gildor> mouse: try pkg_camlp4.mapgenerator
<gildor> to replace pp(camlp4o -filter map)
lopex has joined #ocaml
<gildor> NaCl: what installer (the binary installer) ?
<mouse> Error: Unbound class Camlp4Filters.GenerateMap.generated
<mouse> should I add pkg_camlp4?
<mouse> nope
ygrek has quit [Ping timeout: 250 seconds]
<gildor> the pkg_camlp4.mapgenerator should add -filter Camlp4MapGenerator, is this what you want
<gildor> mouse: ^^^
jamii has joined #ocaml
<mouse> perhaps it is. but how should I invoke that "-filter Camlp4MapGenerator" ?
<mouse> if now through pp(..) ?
<mouse> oh
<gildor> pkg_camlp4.mapgenerator add it for you, but camlp4 handle "synonyms", but I don't remember the mapping
<mouse> i want it to add "-filter map"
<gildor> i.e. maybe map is a synonym for Camlp4MapGenerator
<mouse> the last entry in ocamlbuild log is ...
<mouse> + ocamlfind ocamlc -c -annot -package batteries -package batteries.syntax -package camlp4 -package camlp4.mapgenerator -package sexplib.syntax -package threads -syntax camlp4o -thread -I obsolete -o ast.cmo ast.ml
<mouse> File "ast.ml", line 380, characters 12-47:
<mouse> Error: Unbound class Camlp4Filters.GenerateMap.generated
<mouse> Command exited with code 2.
<mouse>
<mouse> doesn't say much :-)
<gildor> hum -filter map = Camlp4FoldGenerator
<mouse> btw, I'm new to OCaml, ocamlbuild and ocamlfind. sorry if I'm being too slow :-)
<gildor> try pkg_camlp4.foldgenerator
<mouse> why not Camlp4MapGenerator? Is this a buggy synonym? :-)
<gildor> mouse: you are not slow, but camlp4 is not really an easy feature for beginners
<gildor> Camlp4MapGenerator is deprecated in favor of Camlp4FoldGenerator
<mouse> whoohoo. it compiles!
<mouse> thank you very much, gildor. You've been of a great help
<mouse> both ocamlbuild and camlp4 are severly undocumented beasts
<gildor> that the least to say about them
<gildor> RTFS ;-)
<mouse> i probably shouldn't be whining and should rather be contributing
<mouse> yeah, I was about to go and read the source of camlp4
<gildor> start whining on the OCaml BTS, this is a first good step, maybe OCaml upstream will take this more into account if there is a bug opened
<mouse> from the outside, ocaml community seems pretty much dead (or sleeping)
<mouse> in comparison to the Haskell gang
<mouse> :-)
<gildor> indeed, nothing to add about that
<mouse> ocaml seems to be a great tool though
<gildor> except maybe, that there is some cultural background that make the two communities very different
ygrek has joined #ocaml
<gildor> e.g. i.e. French vs English community
<gildor> IMHO, English people tend to release very early small tools, whereas French tends to release huge project when it's done
<gildor> it makes quite a difference in term of "buzz" around the langage
<mouse> like a multicore gc for ocaml? :-)
<mouse> (suddenly, out of **** nowhere!)
<mouse> yeah, ocaml community is very quite
<mouse> and haskell is loud and full of hype
<gildor> well, that is a typical example, when you digg into Parallel Haskell, you'll see that this is not that much a big gain
<mouse> i did already
<mouse> stm, data parallel haskell
<gildor> Parallel Haskell could have been OC4MC once a time
<mouse> all seem like academic toys
* gildor gtg
<mouse> cya. thanks again!
ztfw has joined #ocaml
<NaCl> gildor: the "./configure ; make ; make install" installer
philtor has quit [Read error: Operation timed out]
vivanov has quit [Ping timeout: 258 seconds]
vivanov has joined #ocaml
Anarchos has joined #ocaml
sepp2k has quit [Quit: Leaving.]
sepp2k has joined #ocaml
sepp2k has quit [Client Quit]
sepp2k has joined #ocaml
mouse has left #ocaml []
jamii has quit [Ping timeout: 258 seconds]
Snark has quit [Quit: Ex-Chat]
sepp2k has quit [Quit: Leaving.]
sepp2k has joined #ocaml
ygrek has quit [Quit: Leaving]
mouse has joined #ocaml
jamii has joined #ocaml
ymasory has quit [Quit: Leaving]
<EM03> ocamlnet2 people around?
mouse has quit [Ping timeout: 252 seconds]
munga has quit [Ping timeout: 276 seconds]
<gildor> NaCl: that is possible, fill a bug report about that
<NaCl> kk
* NaCl has to file like 5 bug reports to different projects. >_<
<gildor> NaCl: as long as you don't have to fix them, this is not that much worrying
<gildor> ;-)
<NaCl> heh, in my case, it is more "getting around to it"
vivanov has quit [Quit: Lost terminal]
<Anarchos> the testsuite of tool-ocaml fail only on t240-c_call3.ml : caml_hash_univ_param ; as the hash function has been changed for Murmurhash, i wonder if the testsuite has been upgraded or not
edwin has quit [Remote host closed the connection]
cyy has joined #ocaml
cyy has quit [Client Quit]
axiles has quit [Remote host closed the connection]
cyy has joined #ocaml
cyy has left #ocaml []
<NaCl> what provides the "Types" module? lwt complains about it if I configure it with --enable-all
<NaCl> It's the "enhanced toplevel" that complains
<EM03> can you use the debugger with code that is not bytecode compiled?
<malouin> If ocamlbuild is happily building binaries, can I also get it to build a repl with the various libraries and modules linked and included?
<diml> NaCl: it is a module from the ocaml compiler, you have to install compiler libraries to build the toplevel
ikaros has quit [Ping timeout: 276 seconds]
ftrvxmtrx has quit [Read error: Connection reset by peer]
ftrvxmtrx has joined #ocaml
Anarchos has quit [Quit: Vision[0.9.7-H-090423]: i've been blurred!]
ftrvxmtrx has quit [Read error: Operation timed out]
ftrvxmtrx has joined #ocaml
philtor has joined #ocaml
ftrvxmtrx has quit [Read error: Operation timed out]
ftrvxmtrx has joined #ocaml
<NaCl> diml: kk, I'll look into it, thanks
ftrvxmtrx has quit [Read error: Connection reset by peer]
ftrvxmtrx has joined #ocaml
gnuvince has joined #ocaml
<gnuvince> Are there good OCaml-related videos on the Internet?
elehack has joined #ocaml
<thelema_> gnuvince: videos of people programming in ocaml?
<gnuvince> Either tutorials or things like Yaron's talks at CMU and Harvard
<Plazma> gnuvince, try youtube .. all kinds of cool stuff
<Plazma> and yea i just recently watched a harvard talk from the guy at janestreet ?
jamii has quit [Read error: Operation timed out]
ftrvxmtrx has quit [Read error: Connection reset by peer]
ftrvxmtrx has joined #ocaml
ztfw has quit [Remote host closed the connection]
ftrvxmtrx has quit [Read error: Connection reset by peer]
ftrvxmtrx has joined #ocaml
Morphous_ has quit [Ping timeout: 240 seconds]
ftrvxmtrx has quit [Read error: Connection reset by peer]
ftrvxmtrx has joined #ocaml
Morphous_ has joined #ocaml
elehack has quit [Quit: Farewell, programs.]
ftrvxmtrx has quit [Read error: Operation timed out]
ftrvxmtrx has joined #ocaml
sepp2k has quit [Quit: Leaving.]
philtor has quit [Ping timeout: 260 seconds]