gildor changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/ | OCaml 3.12.1 http://bit.ly/nNVIVH
letrec has joined #ocaml
NaCl has joined #ocaml
untroubled has quit [Quit: leaving]
ggherdov has quit [Quit: bye folks]
struktured has joined #ocaml
ulfdoz_ has joined #ocaml
ulfdoz has quit [Read error: Operation timed out]
ulfdoz_ is now known as ulfdoz
letrec has quit [Ping timeout: 252 seconds]
lamawithonel__ has joined #ocaml
lamawithonel_ has quit [Ping timeout: 276 seconds]
emmanuelux has quit [Remote host closed the connection]
iago has quit [Quit: Leaving]
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 255 seconds]
oriba has quit [Quit: oriba]
mehitabel has quit [Ping timeout: 260 seconds]
mehitabel has joined #ocaml
fraggle_ has quit [Remote host closed the connection]
larhat has joined #ocaml
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 248 seconds]
larhat has quit [Ping timeout: 248 seconds]
TDJACR has left #ocaml []
TDJACR has joined #ocaml
lamawithonel__ has joined #ocaml
lamawithonel_ has quit [Ping timeout: 276 seconds]
larhat has joined #ocaml
smerz has quit [Remote host closed the connection]
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 240 seconds]
Guest04564 has quit [Quit: Page closed]
s_p has joined #ocaml
ulfdoz has quit [Remote host closed the connection]
ulfdoz has joined #ocaml
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 276 seconds]
struktured has quit [Remote host closed the connection]
ulfdoz has quit [Read error: Operation timed out]
lamawithonel_ has quit [Ping timeout: 244 seconds]
lamawithonel_ has joined #ocaml
alpounet has quit [Ping timeout: 260 seconds]
ankit9 has joined #ocaml
s_p has quit [Quit: Leaving.]
lamawithonel__ has joined #ocaml
lamawithonel_ has quit [Ping timeout: 248 seconds]
maufred_ has quit [Read error: Operation timed out]
maufred has joined #ocaml
snearch has joined #ocaml
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 248 seconds]
mika1 has joined #ocaml
cago has joined #ocaml
tmaedaZ has quit [Ping timeout: 276 seconds]
ktklam9 has joined #ocaml
<ktklam9> hi, is there an OCaml equivalent of Hackage for Haskell?
<_habnabit> and hackage is ...?
ftrvxmtrx__ has quit [Quit: Leaving]
tmaedaZ has joined #ocaml
thomasga has joined #ocaml
snearch has quit [Quit: Verlassend]
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 252 seconds]
ktklam9 has quit [Quit: Page closed]
ankit9 has quit [Ping timeout: 245 seconds]
ankit9 has joined #ocaml
lamawithonel__ has joined #ocaml
ttamttam has joined #ocaml
lamawithonel_ has quit [Ping timeout: 276 seconds]
Anarchos has joined #ocaml
<flux> krktz, maybe odb or godi are the closest things
ftrvxmtrx has joined #ocaml
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 252 seconds]
Cyanure has joined #ocaml
<Drakken> I have a module type containing an abstract type, and a functor that expects the type to be polymorphic variants.
Tobu has quit [Ping timeout: 272 seconds]
<Drakken> I didn't say anything about the type except its name, but the compiler says it's not a polymorphic variant type.
<_habnabit> where's your code?
<Drakken> Do you need code?
<_habnabit> it would be useful
<f[x]> Drakken, no, we are all telepaths here
<Drakken> okay, hold on a sec
<f[x]> and people never make mistakes, you know, in interpreting error messages and the like
ttamttam has quit [Ping timeout: 252 seconds]
<Drakken> I always make mistakes. Here's a snippet: http://pastebin.com/fxz2DqB6
<Ptival> what is the "[="?
<Anarchos> how to debug parsers (ocamlyacc) farther tn
<Anarchos> than "Parsing.Parse_error" ?
<Drakken> Ptival ha ha, it only took me a whole evening to figure that out myself :/
<Drakken> It's revised syntax for an exactly defined polymorphic variant type.
<Ptival> revised syntax as in Huet's?
<Drakken> revised syntax as in camlp4/Camlp4Parsers/Camlp4OCamlRevisedParser.ml
<Drakken> i.e. camlp4r
<Ptival> Drakken: is that documented somewhere? :D
<Ptival> in lazy-brain readable format
<Drakken> apparently not
<Ptival> cool
<Ptival> would type ast = [> ] be allowed? :)
<Ptival> somehow you want to convince the type checker that ast is a polymorphic variant type, I don't know how you can though
<Anarchos> Ptival is there any documentaiton for lazy-brains about camlp4 too ? I must admit i never had self-confidence to put hands into camlp4
<Drakken> Error: A type variable is unbound in this type declaration.
<Drakken> In type [> ] as 'a the variable 'a is unbound
<Ptival> Anarchos: dunno, too newbie too
<Ptival> Drakken: you should post on caml-list
<Drakken> okay, I'll try
Tobu has joined #ocaml
<Ptival> I think it's a non trivial and interesting question, don't want the answer to be lost in some IRC log :)
lamawithonel_ has joined #ocaml
err404 has joined #ocaml
<Ptival> plus Jacques Garrigue is actively answering at the moment
<f[x]> ast is abstract
<Anarchos> Drakken thanks a lot
<f[x]> of course compiler will not allow this
ocp has joined #ocaml
<Ptival> f[x]: so, what is possible?
<f[x]> depends on what you want to achieve
lamawithonel has quit [Ping timeout: 276 seconds]
<f[x]> > `Binding of ast & string
<f[x]> this looks extremly strange
<f[x]> do you understand what it means?
<f[x]> is this a human-written code?
<Drakken> yes
<Ptival> with the weird semicolon placement?
<Drakken> it corresponds to "x = foo;" in camlp4 code
<f[x]> this will never pass the compiler
lamawithonel__ has joined #ocaml
<Drakken> don't worry about the semicolons
<f[x]> I don't know where did you take this notation and what you think it means
<Drakken> that's just a style thing
<Drakken> it's a ast node for a parser parser
<f[x]> (`Binding of ast & string) will never pass the compiler
<f[x]> it is not a variant with tuple
<f[x]> go read the manual
lamawithonel_ has quit [Read error: Operation timed out]
<Drakken> there is no manual.
<Drakken> try reading camlp4/Camlp4Parsers/Camlp4OCamlRevisedParser.ml
<Ptival> & is supposed to be a camlp4 thing here?
<f[x]> no
<f[x]> it is irrelevant of camlp4
<f[x]> and covered in manual
<Ptival> "both argument types appear for ‘A as int & string. This means that if we pass the variant tag ‘A to f, its argument should be both int and string."
<Ptival> indeed, ast & string is hopeless
Tobu has quit [Read error: Connection reset by peer]
<Ptival> f[x]: it would pass the compiler though, no? (as long as `Binding is never used)
<f[x]> Ptival, why ask - just try
<Ptival> sure
<f[x]> it is meaningless - thee shall never passs!
<f[x]> that's why I am wondering how it could appear in human-written code and what was that human thinking
<Drakken> f[x] here are some snippets of the relevant camlp4 code: http://pastebin.com/LNyKhqEZ
<f[x]> so what?
<f[x]> it is valid syntax
<f[x]> but not valid semantics
<Drakken> I don't see any other syntax for extending an existing type
<f[x]> that one is outdated a bit
<Drakken> the [= syntax returns the same expression as regular [ syntax in original syntax.
<Drakken> so it's the same semantics.
roha has joined #ocaml
<Drakken> original syntax:
<Drakken> | "["; OPT "|"; rfl = row_field; "]" ->
<Drakken> <:ctyp< [ = $rfl$ ] >>
<f[x]> holy, your problem is not with syntax
<f[x]> the error message rightfully tells that type ast is abstract
<f[x]> I am just pointing that even if you fix that - your code is still strange
<Drakken> I'm just trying to extend a user-defined polymorphic variant type.
<f[x]> then you need to apply functor with type sharing
krktz has left #ocaml []
lamawithonel__ has quit [Ping timeout: 244 seconds]
mononofu has joined #ocaml
mononofu has quit [Read error: Connection reset by peer]
eni has joined #ocaml
ankit9 has quit [Quit: Leaving]
lamawithonel__ has joined #ocaml
ankit9 has joined #ocaml
mononofu has joined #ocaml
untroubled has joined #ocaml
Anarchos has quit [Ping timeout: 276 seconds]
Anarchos has joined #ocaml
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 276 seconds]
eni has quit [Ping timeout: 260 seconds]
untroubled has quit [Quit: leaving]
untroubled has joined #ocaml
roha has quit [Ping timeout: 260 seconds]
Hussaind has joined #ocaml
hiptobecubic has joined #ocaml
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 276 seconds]
ankit9 has quit [Quit: Leaving]
lamawithonel__ has joined #ocaml
lamawithonel_ has quit [Ping timeout: 245 seconds]
caligula has quit [Ping timeout: 255 seconds]
cyphase has quit [Ping timeout: 244 seconds]
alpounet has joined #ocaml
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 250 seconds]
caligula has joined #ocaml
cyphase has joined #ocaml
fabjan has left #ocaml []
smiler has joined #ocaml
eni has joined #ocaml
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 256 seconds]
_andre has joined #ocaml
snearch has joined #ocaml
Cyanure has quit [Ping timeout: 276 seconds]
eni has quit [Quit: Leaving]
roha has joined #ocaml
lamawithonel__ has joined #ocaml
lamawithonel_ has quit [Ping timeout: 276 seconds]
mononofu has quit [Remote host closed the connection]
<Ptival> is there a dichotomic search algorithm over supposedly-sorted arrays somewhere?
<Ptival> actually nvm, I need something more specialized
larhat has quit [Quit: Leaving.]
letrec has joined #ocaml
Cyanure has joined #ocaml
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 265 seconds]
<Anarchos> Ptival look at smoothsort from Edsger Dijsktra
<Ptival> Anarchos: that's irrelevant but interesting :)
Anarchos has quit [Quit: Vision[0.9.7-H-090423]: i've been blurred!]
BiDOrD has joined #ocaml
BiDOrD_ has quit [Ping timeout: 244 seconds]
alxbl has quit [Ping timeout: 252 seconds]
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 256 seconds]
testcocoon has quit [Quit: Coyote finally caught me]
alxbl has joined #ocaml
Submarine has joined #ocaml
Submarine has quit [Changing host]
Submarine has joined #ocaml
testcocoon has joined #ocaml
ankit9 has joined #ocaml
s_p has joined #ocaml
emmanuel__ has joined #ocaml
Submarine has quit [Quit: Leaving]
<s_p> Is there a way to shorten this pattern mathing - http://pastebin.com/ayAsT78t Not to repeat calling the function for every connective ?
snearch has quit [Quit: Verlassend]
Kakadu has joined #ocaml
<thelema> s_p: you could change the connective to BinOp(And, p, q), etc.
hiptobecubic has quit [Ping timeout: 252 seconds]
<s_p> thelema: thanks, I got it.
testcocoon has quit [Quit: Coyote finally caught me]
lamawithonel_ has quit [Ping timeout: 245 seconds]
lamawithonel__ has joined #ocaml
gnuvince has joined #ocaml
testcocoon has joined #ocaml
ankit9 has quit [Remote host closed the connection]
smondet has joined #ocaml
philed has joined #ocaml
TDJACR has quit [Changing host]
TDJACR has joined #ocaml
cdidd has joined #ocaml
lamawithonel has joined #ocaml
lamawithonel__ has quit [Ping timeout: 276 seconds]
avsm has joined #ocaml
untroubled has quit [Quit: leaving]
philed has quit [Ping timeout: 276 seconds]
philed has joined #ocaml
<philed> Hey all. I'm running into problems when including multiple structures with overlapping type definitions. Am I doing something wrong, or is this a common issue?
<mrvn> iirc you are not allowed to redefine types
<mrvn> in modules
<philed> Right, but I really wanna!
<mrvn> philed: do you maybe want to open the modules?
<philed> No, I think I want to include both. But now that I look at it again, I've got a different idea.
<mrvn> philed: you can use stubs instead of include type t2 = M.t let foo = M.foo ...
oriba has joined #ocaml
<philed> Yeah, but that might mean rewriting a large interface, and then I've got to remember to extra stubs if I ever decide to grow the interface.
<philed> *to add extra stubs.
<mrvn> then rename the original types.
roha has quit [Ping timeout: 260 seconds]
<philed> I tried, but that causes other problems. I want to be able to apply both modules to the same collection of functors in one case, and in another case, I'd like to be able to merge the two modules.
<philed> But I think I can avoid doing it.
<mrvn> I think you can rename types when you apply the functor, something like Make(M with type t = t2)
<philed> No, with constraints only apply to signatures.
<mrvn> Make(struct include M type t = t2 end)
<philed> Huh.
<philed> Yeah, that's kinda obvious.
<mrvn> Too bad you can't say struct include M type t2 = t untype t end
<philed> Yeah, or just do a destructive type renaming like you can with signatures.
<philed> But yeah, I don't know what that hadn't occurred to me. Cheers!
<mrvn> philed: how do you rename a type in a signature?
<mrvn> because then you can do (struct include type t2 = t end : signature)
<philed> module type Foo = struct type t end
<philed> module type Bar = type s include Foo with type t := s end
<philed> Now Bar will only have the type s.
<philed> It's a language extension with 3.12.
lamawithonel_ has joined #ocaml
lamawithonel has quit [Ping timeout: 276 seconds]
ocp has quit [Ping timeout: 272 seconds]
ftrvxmtrx has quit [Quit: Leaving]
cago has quit [Quit: Leaving.]
mika1 has quit [Quit: Leaving.]
<letrec> how to compile with compilerlibs?
<letrec> I have INCDIRS = /usr/lib/ocaml/compiler-libs in my makefile, but it doesn't work
<letrec> INCDIR = +../compiler-libs doesn't work as well
<adrien> "INCDIRS"? what's that?
<letrec> I'm using OCamlMakefile
ocp has joined #ocaml
<philed> Sorry, I only use ocamlbuild.
<adrien> and which lib are you trying to use?
<mrvn> What does one need compiler-libs for? camlp4?
<letrec> this is a lib that provides some ocaml compiler internals
<letrec> I need it to process compiled ocaml libs
<adrien> I mean, INCDIRS is only a search path
<adrien> not a lib
<adrien> are you setting any lib?
<letrec> I just want to be able to use a bunch of compiled modules which is a part of the package
alaincoste has joined #ocaml
alaincoste has left #ocaml []
oriba has quit [Quit: oriba]
iago has joined #ocaml
ftrvxmtrx has joined #ocaml
eni has joined #ocaml
<mrvn> Programming would be so much easier with limitless memory.
letrec has quit [Ping timeout: 248 seconds]
mononofu has joined #ocaml
<mrvn> Anyone know offhand how Gc.finalise is implemented? Would it slow down the GC to register a million of them?
Kakadu has quit [Quit: Konversation terminated!]
Cyanure has quit [Ping timeout: 260 seconds]
eni has quit [Ping timeout: 260 seconds]
<tchell> oi... if I use ocamlbuild to create object files, it likes to put them in _build/foo.cmo, but if I #load "_build/foo.cmo" in the toplevel, somehow it doesn't call the module "Foo".
<tchell> I can cd to _build to run the repl, but it feels like this strategy will break at some point.
Snark has joined #ocaml
<flux> tchell, #directory "_build";;
<flux> #load "foo.cmo";;
<tchell> amazing!
<tchell> where should I have seen that?
<tchell> yeah I just found it. Thanks.
<tchell> rlwrap ocaml -I `find . -name '_build' -type d` seems to work for me.
<flux> btw, the problem with your #load was that it couldn't find the .cmi file
<flux> those are required for the actual symbols to appear
<tchell> really? It doesn't look for _build/foo.cmi given _build/foo.cmo? There was a .cmi file there.
<flux> it only searches search directories
<tchell> ok. I am happy now!
<tchell> Apparently once the directories are in order I also don't need to #load anything anyway; I can just open it.
cyphase has quit [Read error: Connection reset by peer]
fraggle_laptop has joined #ocaml
<flux> hmm, you may be able to open it but you probably don't have the symbols really
untroubled has joined #ocaml
<mrvn> flux: if the cma is build right it dynamically opens the right stub files
<flux> mrvn, but you need to #load the .cma?
<thelema> philed: yes, you can use the 3.12 module type magic to remove the existing type and replace it with a new one
<flux> or how does that work
<mrvn> sorry, I use ocamlopt :)
<philed> thelema: But that's just for signatures, right?
<flux> it's been so long I've since used anything else than findlib.. even when I used my own libraries I just used ocamlfind with them.
<thelema> philed: yes, but you can apply a signature when you include a module
<philed> Aha.
<thelema> philed: module NewM = type t = foo include (M: module type of M with type t := t) end
<mrvn> thelema: What does that do? Remove the type t = foo or the M.t?
<thelema> mrvn: that includes M but with type t removed and with anything depending on t replaced with depending on the outside t (= foo)
<thelema> (untested code; maybe has typo or bug)
<mrvn> thelema: what if M.t is abstract?
<mrvn> module NewM = type t include (M: module type of M with type t := t) end
<mrvn> ?
<thelema> one sec while I find out using ocaml toplevel
cyphase has joined #ocaml
<thelema> newM must have a concrete type
<mrvn> manual 7.16 Substituting inside a signature
<mrvn> philed: They have exactly your problem as example.
<mrvn> "A natural application of destructive substitution is merging two signatures sharing a type name."
<thelema> # module M : sig type t end = struct type t = int end;;
<thelema> module M : sig type t end
<thelema> # module NM = struct type t = string include (M: module type of M with type t := t) end;;
<philed> thelema: Awesome. Cheers!
<thelema> module NM : sig type t = string end
roha has joined #ocaml
<mrvn> thelema: doesn't that break M because now it gets the wrong type?
<philed> thelema: It's not quite the same, because they're doing includes in a signature, not a structure.
<philed> Sorry, that was to mrvn.
<mrvn> philed: yes, just noticed myself.
<mrvn> philed: but as thelema showed you change the signature and use that on the module to change it.
<philed> Yeah, I didn't realise you could do that.
<mrvn> # module M : sig type t val add : t -> t -> t val make : int -> t end = struct type t = int let add = (+) let make x = x end;;
<mrvn> # module NM = struct type t = string include (M: module type of M with type t := t) end;;
<mrvn> Values do not match:
<mrvn> val add : t -> t -> t
<mrvn> is not included in
<mrvn> val add : t -> t -> t
<mrvn> hehe, t != t :)
Tobu has joined #ocaml
<mrvn> philed: renaming a type: # module NM = struct type t2 = M.t include (M: module type of M with type t := t2) end;;
Cyanure has joined #ocaml
<philed> mrvn: Yep, I've got it working now.
<philed> I hadn't used the "recovering the type of a module" feature before.
<mrvn> When was "type of" added?
<mrvn> in 3.12 too?
<philed> Yeah.
<philed> Ugh. But I can't use it in HOL Light.
ulfdoz has joined #ocaml
fraggle_ has joined #ocaml
Hussaind has quit [Quit: Konversation terminated!]
iago has quit [Ping timeout: 244 seconds]
eni has joined #ocaml
eni has quit [Ping timeout: 250 seconds]
eni has joined #ocaml
Snark has quit [Quit: Quitte]
iago has joined #ocaml
Xizor has joined #ocaml
hiptobecubic has joined #ocaml
fraggle_ has quit [Remote host closed the connection]
thomasga has quit [Quit: Leaving.]
lorilan has joined #ocaml
<lorilan> hello !
<lorilan> while interfacing ocaml with c, is it possible to register a c variable with a "weak" link ?
<mrvn> You can only register ocaml variables
<lorilan> i mean, to make tu GC update the value of the pointers when he is moving the variable, but not preventing him of delete the variable
<mrvn> you mean create a Weak.t from C?
<mrvn> probably.
<lorilan> 2 sec i'm looking what's Weak.t
<lorilan> yes exactly
<mrvn> Nothing about that in "Interfacing with C". I guess you have to read the source of Weak to see how Weak.create works.
<lorilan> ok
<lorilan> thanks anyway, you gave me a good trail
eni has quit [Ping timeout: 260 seconds]
roha has quit [Ping timeout: 260 seconds]
<flux> some advancement in the beam detector: http://www.modeemi.fi/~flux/reprap/laser-leveling/beam-detector2.png
ftrvxmtrx_ has joined #ocaml
ftrvxmtrx has quit [Ping timeout: 260 seconds]
Anarchos has joined #ocaml
iago has quit [Ping timeout: 245 seconds]
Qrntz has joined #ocaml
sivoais has quit [Read error: No route to host]
sivoais has joined #ocaml
hiptobecubic has quit [Ping timeout: 252 seconds]
_andre has quit [Quit: leaving]
s_p has quit [Quit: Leaving.]
joelr has joined #ocaml
<joelr> good evening
<joelr> how do i grab envp from my ocaml main?
<mrvn> Unix.environment / getenv / putenv
<joelr> mrvn: thanks
<joelr> mrvn: but is there a way to grab the envp pointer that was passed to the c main in the ocaml runtime?
<joelr> mrvn: never mind, it's a whole string array. thanks!
larhat has joined #ocaml
cdidd has quit [Remote host closed the connection]
mononofu has quit [Remote host closed the connection]
roha has joined #ocaml
<joelr> is anyone using TypeRex?
<joelr> do you notice a significant lag when editing in emacs?
fraggle_ has joined #ocaml
err404 has quit [Ping timeout: 264 seconds]
Anarchos has quit [Quit: Vision[0.9.7-H-090423]: i've been blurred!]
Drakken has quit [Ping timeout: 256 seconds]
Drakken has joined #ocaml
gnuvince has quit [Ping timeout: 250 seconds]
<mrvn> Poll: What is your solution to recursive modules/functions? Do you use rec, pass closures around or let fn = ref (fun () -> raise (Invalid_argument "not set yet"))?
<mrvn> the modules/functions in this case being substantial: 150, 125, 98, 707 lines
tufisi has quit [Ping timeout: 245 seconds]
<hcarty> mrvn: rec or functors if it helps get rid of the recursion
<hcarty> mrvn: Or pass around modules in somewhat rare cases
<mrvn> pass around modules would be the runtime equivalent to functors, right?
<hcarty> mrvn: Somewhat. You could mix the two.
<hcarty> Apply the functors in a function and pass the resulting modules around
<mrvn> I have a graph and not just a simple ring. Might get tricky with functors.
<gildor_> diml: ping ?
<mrvn> hcarty: I would pass a module around if I need to pass more than one closur from a module I think. Seems easier than to build a record of closures.
<mrvn> first class modules are still new
<diml> gildor_: pong
oriba has joined #ocaml
<hcarty> mrvn: That's where I have ended up passing modules around. It's a bit more verbose in some cases than records but the intent can be clearer.
<mrvn> gildor_: any way to remove spaces from empty lines in setup.ml?
<mrvn> hcarty: can you pass the "self" module around?
<gildor_> diml: hi, is there a way to know the number of active lwt thread
<gildor_> mrvn: because it is unnerving to see emacs removing them when you try to edit setup.ml ?
<hcarty> mrvn: Not that I know of... maybe you could with recursive modules?
<gildor_> mrvn: I was not aware of this kind of issue before C. Troestler told me
<mrvn> gildor_: or if they end up in quilt.
<mrvn> gildor_: overall they are just a waste of good bytes. :)
<gildor_> mrvn: this is on my todo list (but in my head), open a feature request/bugs if you want to be sure it doesn't get out of my head
<mrvn> gildor_: how do I tell emacs to remove spaces from empty lines in tuareg mode?
<gildor_> mrvn: I am already chasing them in commits
<gildor_> mrvn: don't know, don't use emacs
<mrvn> I found that sometimes it leaves some behind. And when I grepped for "^ *$" I noticed tons of matches in setup.ml and myocamlbuild.ml. :)
<diml> gildor_: by active you mean ones that are waiting for an event ?
<gildor_> diml: I want to know if there are still running threads in ocsigen before deciding that I get an error in the unit test of oasis-db
<gildor_> diml: I am not really precise about the meaning, because I don't really know
<gildor_> diml: let says i have bunch of threads that might create a file, and I want to be sure that I fail because this file will never be created
<gildor_> diml: I want to know which threads are waiting for socket event...
<joelr> any clues on this? Error: An external function with more than 5 arguments requires a second stub function
<joelr> for native-code compilation
<gildor_> joelr: std native/bytecode binding ?
<mrvn> gildor_: oasis question: Why do I get a settler.native link but no settler link?
<joelr> gildor_: i'm building for native code, though. hmm… i guess i need to provide the bytecode function too.
<mrvn> joelr: see the manual.
<gildor_> mrvn: oasis don't create link, ask ocamlbuild ;-)
<mrvn> gildor_: damn. :)
<gildor_> mrvn: I always end up, -no-links when invoking ocamlbuild
<joelr> ok
<mrvn> gildor_: oddly enough there is a _build/settler. Just no link
<joelr> anyone using TypeRex?
<gildor_> mrvn: I don't use the provided links, I got directly into _build
<joelr> noticing a significant lag in emacs?
<hcarty> joelr: I don't use either, but I've read that others have had the same issue
<gildor_> joelr: AFAIK, you must use it on Mac (esp. with Aquaemacs)
<hcarty> joelr: IIRC the solution was to turn something off
<joelr> gildor_: you mean i should use it on the mac or i should not? i use it with carbon emacs
<joelr> hcarty: is there a mailing list?
iago has joined #ocaml
<hcarty> joelr: There is likely something on the TypeRex site about it
<joelr> ok
<gildor_> hcarty, joelr: I think there is a problem with socket handling on Mac with emacs
<joelr> hcarty: i'll look, thanks
<hcarty> joelr: I'm not sure. I think this was on the main OCaml mailing list
<joelr> oh...
<hcarty> joelr: Good luck :-)
<hcarty> gildor_: Ah. I think there was a solution though, even if it did disable some functionality...
<gildor_> hcarty: maybe, I don't use emacs and I don't use typerex
<hcarty> But I don't remember the details of the fix or its effects
<hcarty> gildor_: Neither do I - the blind providing emacs support I suppose :-)
<gildor_> looks like I am not the right person to give an answer about that
<gildor_> come on mrvn, we do 10x better map at google
<mrvn> Slowly I'm getting to the point where something even happens in the Game.
<mrvn> gildor_: ??
alpounet has quit [Quit: Quitte]
<gildor_> mrvn: you didn't see this 8bit maps on April 1st ?
<gildor_> mrvn: what is your game about ?
<hcarty> diml: Do you know of an implementation of Rtime with Lwt's React wrapper?
<mrvn> gildor_: I did.
<diml> gildor_: it should be possible to know if threads are waiting on a socket
<mrvn> gildor_: A clone of Siedler 3
<diml> hcarty: i don't know Rtime very well
<mrvn> gildor_: or wideland but without the manual roads Siedler 1/2 had.
fraggle_laptop has quit [Remote host closed the connection]
<gildor_> mrvn: nice project
<gildor_> mrvn: I think I played "The Settlers" 10 years ago
<mrvn> gildor_: I think the last was Settler 7.
<gildor_> mrvn: ah hem, no... either Settlers 2 or 3 in fact
<gildor_> surely not after
<mrvn> gildor_: Settler 7 is younger than 10 years
<mrvn> I just ment that the franchise is still alive
<gildor_> mrvn: you know there is time you say something, and realize that 5 years of your life has disappeared in the meantime
<mrvn> scary, isn't it?
<gildor_> more than you think
<hcarty> diml: Ok, just curious. I'd like to have a timeline in an Lwt-using project. Rtime looked potentially interesting since Lwt comes with React support already.
<gildor_> diml: nevermind, I just realize that I already have a timeout of 60s and it didn't work
<gildor_> diml: maybe it is just that Inotify is too fast too notify me
<gildor_> I should wait 1s before reading the file.
<gildor_> it works when verbose is turned on, must be a timing issue
roha has quit [Ping timeout: 250 seconds]
<mrvn> gildor_: tomorrow I can add the code for the buildings to do something. The green roofed one is supposed to send out a tux that plants trees and the red one one that chops them down and produces tree trunks.
smondet has quit [Quit: Leaving, happy hacking!]
joelr has quit [Quit: joelr]
cdidd has joined #ocaml
Cyanure has quit [Remote host closed the connection]
Xizor has quit []
gnuvince has joined #ocaml
letrec has joined #ocaml
philed has quit [Ping timeout: 252 seconds]