adrien changed the topic of #ocaml to: Discussions about the OCaml programming language | http://www.ocaml.org | OCaml 4.02.2 announced http://ocaml.org/releases/4.02.html | Try OCaml in your browser: http://try.ocamlpro.com | Public channel logs at http://irclog.whitequark.org/ocaml
rand000 has quit [Quit: leaving]
martinium has joined #ocaml
ollehar has quit [Read error: Connection reset by peer]
ollehar has joined #ocaml
<Algebr> you don't really convert it... you match on it and deal with the result of the match
swgillespie has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
tmtwd has quit [Ping timeout: 246 seconds]
<dmbaturin> Algebr: You are writing to a closed channel, beware of exceptions. :)
ztennix has joined #ocaml
emmanueloga has quit []
emmanueloga has joined #ocaml
<Algebr> heh.
Haudegen has quit [Ping timeout: 264 seconds]
mea-culpa has quit [Remote host closed the connection]
Haudegen has joined #ocaml
manud has quit [Quit: manud]
kushal has joined #ocaml
manud has joined #ocaml
ygrek_ has quit [Ping timeout: 250 seconds]
Algebr has left #ocaml ["ERC Version 5.3 (IRC client for Emacs)"]
johnf has quit [Read error: Connection reset by peer]
Haudegen has quit [Ping timeout: 244 seconds]
MrScout has joined #ocaml
Haudegen has joined #ocaml
tmtwd has joined #ocaml
toomuchtvrotsurb has quit [Remote host closed the connection]
toomuchtvrotsurb has joined #ocaml
MrScout has quit [Read error: Connection reset by peer]
MrScout has joined #ocaml
toomuchtvrotsurb has quit [Ping timeout: 240 seconds]
AltGr has joined #ocaml
manizzle has quit [Ping timeout: 250 seconds]
pyx has joined #ocaml
pyx has quit [Client Quit]
swgillespie has joined #ocaml
johnf has joined #ocaml
shinnya has quit [Ping timeout: 256 seconds]
tmtwd has quit [Remote host closed the connection]
kiwnix has quit [Read error: error:1408F10B:SSL routines:SSL3_GET_RECORD:wrong version number]
lopex has quit [Quit: Connection closed for inactivity]
tmtwd has joined #ocaml
tnguyen has quit [Quit: tnguyen]
Algebr has joined #ocaml
<Algebr> Drup: tyxml's usage of the type system is confusing
NSA_Agent has joined #ocaml
jwatzman|work has quit [Quit: jwatzman|work]
tmtwd has quit [Remote host closed the connection]
Bhavya has joined #ocaml
Algebr has quit [Remote host closed the connection]
Algebr has joined #ocaml
<Algebr> How do I tell oasis to not worry about me modifying the makefile
NSA_Agent has quit [Quit: Leaving]
kushal has quit [Quit: Leaving]
ggole has joined #ocaml
jeffmo has quit [Ping timeout: 244 seconds]
darkf has joined #ocaml
jeffmo has joined #ocaml
mort___ has quit [Quit: Leaving.]
manud has quit [Quit: manud]
johnf has quit [Read error: Connection reset by peer]
jeffmo has quit [Read error: Connection reset by peer]
aurynj has joined #ocaml
jeffmo has joined #ocaml
aurynj has quit [Quit: Leaving]
BitPuffin|osx has quit [Ping timeout: 250 seconds]
yminsky has quit []
yminsky has joined #ocaml
ygrek has joined #ocaml
kushal has joined #ocaml
jeffmo has quit [Quit: jeffmo]
MercurialAlchemi has quit [Remote host closed the connection]
MercurialAlchemi has joined #ocaml
MercurialAlchemi has quit [Ping timeout: 260 seconds]
MrScout has quit [Ping timeout: 244 seconds]
seako has quit []
huza has joined #ocaml
seako has joined #ocaml
ollehar1 has joined #ocaml
ncthom91 has quit [Quit: My MacBook has gone to sleep. ZZZzzz…]
lewis1711 has joined #ocaml
Simn has joined #ocaml
kushal has quit [Quit: Leaving]
ncthom91 has joined #ocaml
keep_learning has joined #ocaml
manud has joined #ocaml
ncthom91 has quit [Quit: My MacBook has gone to sleep. ZZZzzz…]
MrScout has joined #ocaml
ollehar1 has quit [Remote host closed the connection]
Submarine has quit [Quit: Leaving]
octachron has joined #ocaml
huza has quit [Quit: WeeChat 0.3.8]
creichert has quit [Ping timeout: 246 seconds]
keen__________30 has joined #ocaml
keen__________29 has quit [Ping timeout: 255 seconds]
voglerr has joined #ocaml
TheLemonMan has joined #ocaml
Bhavya has quit [Quit: Quit the channel]
sepp2k has joined #ocaml
sh0t has joined #ocaml
zpe has joined #ocaml
manud has quit [Quit: manud]
<flux> were we going to have let! at some point, to accompany open! etc? re. shadowing?
<flux> adding the ability to add a warning about shadowing
sh0t has quit [Ping timeout: 244 seconds]
ygrek_ has joined #ocaml
toolslive has joined #ocaml
ygrek has quit [Ping timeout: 264 seconds]
Hannibal_Smith has joined #ocaml
<ollehar> why not just add a compiler option for warning about this, flux?
<flux> ollehar, and which option would that be?
<flux> or are you suggesting a new feature?
<ollehar> yes
<flux> well, that's what I was suggesting as well :)
<ollehar> :)
<flux> but if you can't override the warning, then it can become annoying
yomimono has joined #ocaml
<flux> and so comes the idea of let!
<ollehar> ah
<octachron> flux, so let! would be to disactivate the shadowing warning with open?
<flux> let a = 42 in expr; let a = 44 in expr would trigger a warning. let.. let!.. would not.
<flux> seems mantis doesn't have text search..
Submarine has joined #ocaml
manud has joined #ocaml
cthuluh has quit [Ping timeout: 265 seconds]
<keep_learning> Hello everyone.
<keep_learning> I am trying to write a brainf**k parser http://lpaste.net/137253 and using ppx_deriving
<keep_learning> but getting lot of compiler error. Could some one please tell me how to compile the code.
<keep_learning> corebuild -use-menhir -package ppx_deriving calc.byte
dsheets has quit [Ping timeout: 246 seconds]
<octachron> Are you using Core libraries? If not try to use ocamlbuild
<octachron> otherwise you would have to desactivate the Core camlp4 syntax extension
cthuluh has joined #ocaml
<keep_learning> octachron: ocamlbuild -use-menhir -package ppx_deriving calc.byte says Error: Unbound value pp
<ollehar> keep_learning: you might need more [@@deriving show]
<ollehar> if a type uses another type
<ollehar> hm
<ollehar> but that's not the case in you pastebin, though.
<lewis1711> I made my ocaml code less type safe and now it's much smaller and less convluted. I always over-type when I use these kind of languages
<companion_cube> I'm wondering why Format.bprintf is considered "unsafe" (and deprecated)
<companion_cube> is it a flush problem?
<ggole> Somehow I find myself "needing" recursive module types... how did I get here?
<companion_cube> type t = { foo : t set }, I guess?
<ggole> I'm trying to write a little reflection library
<octachron> keep_learning, have you tried pp_nameoftype ?
<companion_cube> reflection library? please tell more! :)
<keep_learning> octachron: No, did you mean ocamlbuild -use-menhir -package pp_nameoftype calc.byte ?
<ggole> In trying to allow access to constructor arguments, I've found myself wanting a type that is basically ... -> 'a, for any chain of arguments ...
<keep_learning> octachron: or Format.printf "%a@." pp_nameoftype e ?
<octachron> yes, if I read it correctly ppx_deriving convention is to suffix the name of type to the name of the function so pp -> pp_typename
<ggole> It can be done with GADTs, but the resulting type variable isn't really usable. You can't instantiate it with a particular type, or at least I can't figure out how to.
<companion_cube> I think you can try to take some inspiration in format strings
<ggole> So the approach I've taken is to use modules to represent an argument list ending in 'a as a type 'a t in a module Args
<ggole> But now that needs to contain a Type.t, so I've got recursive modules. :/
<octachron> ggole: do you mean something like ('a -> 'b -> 'c -> 'd -> 'e) with an access to the last type argument 'e ?
<ggole> Yep.
<companion_cube> I think format does this kind of stuff, yes
<companion_cube> the return type is present in format4's arguments
<octachron> In this situation I generally just store 'e in a separated parameter:
<ggole> This is what I have so far
<octachron> _ list = Nil : <tail:'a; list:'a> list | Cons : 'a * <tail:'t;list:'l> list -> <tail:'t; list:'a -> 'l > list
<ggole> Yeah, I tried that already
<companion_cube> ggole: have you looked at the 'a ty OCaml branch?
<companion_cube> with an 'a ty type that reflects what 'a looks like
<ggole> I wrote a gadt-driven generic print that worked: but I didn't manage to write a generic copy
<ggole> octachron: but does using object types give some additional capability here?
<companion_cube> oh, copy
<companion_cube> tough
<octachron> ggole: no, just more readability
<companion_cube> ggole: it's not additional capabilities, but readability
<companion_cube> aw
<ggole> That's the print
<ggole> Type.app is the GADT in question
<companion_cube> I'm not sure, does your GADT include information about how to build values of type 'a ?
<ggole> Not this one
<companion_cube> then you can't copy
<ggole> Right, that's the problem
<ggole> I have either print or copy, but not both
<companion_cube> in the sum (and product) case, you need to add a function in the record, that explains how to build each variant
<ggole> I *think* that the problem boils down to representing ... -> 'a in a way that can be nicely unified with ... -> s (for a sum type s)
<companion_cube> can't you take a hlist as parameter?
<companion_cube> (for each sum variant)
<ggole> I am, in the second paste
Aang4chi has joined #ocaml
dsheets has joined #ocaml
<ggole> companion_cube: oh, in the first paste that's what I'm trying to do
<ggole> Eg, put a Type.t in Arg. But the hlist ends up crossing module boundaries, which kills me.
<companion_cube> hmm, just define all your GADT at the same place and re-export them in Arg and Type
<keep_learning> octachron: did you mean pp_typename by pp_prog ( the type of my abstract syntax tree ) ?
MercurialAlchemi has joined #ocaml
<keep_learning> Format.printf "%a@." pp_prog e still complaining about Error: Unbound value pp_prog
<companion_cube> we've been talking about making a generic 'a ty type, with a ppx_deriving
<companion_cube> ggole: would you be interested?
<ggole> Yeah, that's pretty much the same thing I'm struggling with at the moment
<companion_cube> I can't find an old snippet gasche gave me
<companion_cube> :(
arquebus has joined #ocaml
<lewis1711> is there a way to load multiple modules at once? I can't even separate "#mod_use" with ;;.
rand000 has joined #ocaml
<companion_cube> grrr, reading old batteries-devel mails
<companion_cube> sad :/
<octachron> keep_learning, yes. I think that the error is that you should use the ppx_deriving.std package rather than ppx_deriving
<keep_learning> octachron: Still error. Sorry I am new to ocaml. ocamlbuild -use-menhir -package ppx_deriving.std calc.byte Error: Unbound value pp_prog
<keep_learning> Format.printf "%a@." pp_prog e
MrScout has quit [Ping timeout: 246 seconds]
<ollehar> keep_learning: don't you need to include package ppx_deriving.show?
<keep_learning> ollehar: You mean ocamlbuild -use-menhir -package ppx_deriving.std -package ppx_deriving.show calc.byte ?
<ollehar> yeah
<keep_learning> still the same error
<ollehar> keep_learning: can you compile without printf pp_prog, or do you get missing pp?
jeffmo has joined #ocaml
<keep_learning> ollehar: yes, it's compiled without Format.printf "%a@." pp_prog e
<ollehar> keep_learning: oh, so how about printf "%s" (show_prog prog)?
<keep_learning> ollehar: Error: Unbound value show_prog
<keep_learning> Format.printf "%s" (show_prog e)
<keep_learning> e is parse tree
<ollehar> hm ok
<ollehar> but you didn't add [@@deriving show] to the parse tree definition?
<octachron> keep_learning: Sorry, I missed that, you need to use Ast.pp_prog
<ollehar> try:
<ollehar> type prog = command list
<ollehar> [@@deriving show]
<ollehar> | Incv | Decv
<ollehar> and command =
<ollehar> | Incp | Decp
<ollehar> | Input | Output
<ollehar> | Loop of command list
<ollehar> [@@deriving show]
<ollehar> AND in your Ast module, add [@@deriving show] to the types.
yomimono has quit [Ping timeout: 255 seconds]
<companion_cube> ggole: I have this https://gist.github.com/c-cube/39546294f8b91f9cc1e0
<companion_cube> but building records it tough too
<ollehar> oh, that's the top of the file, sorry ^^
arquebus has quit [Quit: konversation disconnects]
ygrek_ has quit [Ping timeout: 240 seconds]
<octachron> ollehar: [@@deriving show] apply to the whole set of definitions so having only one is fine
keep_learning has quit [Ping timeout: 246 seconds]
keep_learning has joined #ocaml
<keep_learning> ollehar: Sorry got disconnected.
<keep_learning> adding [@deriving show} is not making any difference.
<keep_learning> type prog = command list [@@deriving show] and command = | Incv | Decv | Incp | Decp | Input | Output | Loop of command list [@@deriving show]
<keep_learning> Error: Unbound value show_prog
<companion_cube> do you use 4.02.2 ?
<keep_learning> companion_cube: I am using OCaml version 4.02.1
<companion_cube> that might be the issue, extension points have changed
<companion_cube> and the newest ppx_deriving is tailored for 4.02.2
<ggole> Error: Cannot safely evaluate the definition of the recursively-defined module Arg, great
<ggole> I'm only defining a module TYPE, there's not even any values -_-
<companion_cube> I think you really should avoid recursive modules
<ggole> I would love to, but I seem to need something like HKTs :/
kushal has joined #ocaml
Simn has quit [Ping timeout: 256 seconds]
yomimono has joined #ocaml
sivoais has quit [Ping timeout: 244 seconds]
<ggole> Wait, it was something else
<companion_cube> ggole: did you take a look at my gist?
<companion_cube> (it's heavy, but it should be quite powerful)
sivoais has joined #ocaml
<ggole> Yeah, I'm looking at it now
<ollehar> keep_learning: ok, strange. maybe you should try to update first, but also try just to compile only ast.ml with let _ = printf "%s" (show_prog (prog def here...))
<companion_cube> I'm writing a print function right now
<ggole> Hmm, rather than native functions you "interpret" hlists
<ggole> Maybe that's the way to go...
<companion_cube> that's more flexible, I think, but slower
<companion_cube> unless flambda saves us all!!
<ggole> I'll see how far I get with this
<companion_cube> (it could, it's basically a lot of unrolling)
<companion_cube> ggole: are you writing a lib?
<ggole> Just a toy atm
<companion_cube> on github, I mena
<companion_cube> okj
<ggole> It piqued my interest because it's basically an open-ended runtime version of deriving
<companion_cube> heh
lopex has joined #ocaml
<keep_learning> ollehar: I wrote this small code in ast.ml let _ = Format.printf "%s" (show_prog ([Incv, Incv]))
<ggole> And now I'm fighting with the type checker and don't want to admit defeat
<keep_learning> ocamlbuild -package ppx_deriving.std -package ppx_deriving.show ast.byte
<keep_learning> Unbound value show_prog
sivoais has quit [Ping timeout: 240 seconds]
<companion_cube> ggole: https://gist.github.com/c-cube/39546294f8b91f9cc1e0 <--- embryo of printing function
sivoais has joined #ocaml
<companion_cube> this stuff should have a ppx, because writing 'a ty by hand is a nightmare
<companion_cube> and flambda is probably needed to make it efficient
l1x has quit []
l1x has joined #ocaml
<ollehar> keep_learning: still not... wait, it should be ppx_deriving.show. but maybe show is included in std?
<lewis1711> is there a way to have a file of top-level expressions?
<companion_cube> yes, std includes show
<ollehar> ok
strmpnk has quit []
<ollehar> keep_learning: sorry, not at home so I can't try, but later tonight if you're still on. :)
<ollehar> or post it to stackoverflow.
strmpnk has joined #ocaml
<ggole> companion_cube: what about a copy?
<keep_learning> ollehar: Thank you for your help.
jabesed has joined #ocaml
<ollehar> np
ztennix has quit [Ping timeout: 240 seconds]
grouzen has joined #ocaml
ceryo has joined #ocaml
IbnFirnas has quit []
IbnFirnas has joined #ocaml
_andre has joined #ocaml
manud has quit [Quit: manud]
<Drup> ggole: I did that in furl
<Drup> gimme a sec, making a small example
Submarine has quit [Quit: Leaving]
<Drup> I banged my head against the issue in line 19 quite hard already. The problem boils down to the fact that you can't lift the value restriction over 'ret in t because it is not covariant and I didn't found another way to solve it
<Drup> Algebr: yes, tyxml's type system is a bit akward. I agree :)
ggherdov has quit []
aurynj has joined #ocaml
<companion_cube> ggole: I will try; it's more difficult because you also need to build values
<companion_cube> but I think it's possible
manud has joined #ocaml
<ggole> companion_cube: I think you need to chain closures: that's how I did it, anyway
<ggole> afk for a while, I'll come back and take another crack at it later.
<ggole> Thanks for the responses everyone.
<Drup> ggole: If you find a way to represent the same type but manage to avoid the value restriction, I'll grateful :D
<Drup> +be
ggherdov has joined #ocaml
grouzen has quit [Ping timeout: 255 seconds]
<Drup> keep_learning: did you tried in 4.02.2 ?
<keep_learning> Drup: no
<Drup> because, well, it works for me.
<keep_learning> Drup: Let me try.
<Drup> Ah !
<Drup> keep_learning: Add "-use-ocamlfind" as first argument of ocamlbuild
<keep_learning> Drup: Thank you, It's working with 4.02.1 also
<ollehar> hah
ngram has quit [Ping timeout: 246 seconds]
Simn has joined #ocaml
Aang4chi has left #ocaml ["ERC (IRC client for Emacs 24.5.1)"]
manud has quit [Quit: manud]
ztennix has joined #ocaml
ztennix has quit [Ping timeout: 244 seconds]
ceryo has quit [Quit: Textual IRC Client: www.textualapp.com]
tashjash has joined #ocaml
ceryo has joined #ocaml
Haudegen has quit [Ping timeout: 240 seconds]
voglerr has quit [Remote host closed the connection]
octachron has quit [Ping timeout: 246 seconds]
voglerr has joined #ocaml
<ggole> omfg it works
<ggole> This may be the most horrible OCaml code I've written since that in-place string truncation that used Obj!
tnguyen has joined #ocaml
grouzen has joined #ocaml
<ggole> A resounding victory over the type checker and good taste: think I'll celebrate by having dinner.
Haudegen has joined #ocaml
<pippijn> ggole: what did you do?
mankyKitty has quit []
mankyKitty has joined #ocaml
octachron has joined #ocaml
sspi has quit []
sspi has joined #ocaml
Haudegen has quit [Ping timeout: 255 seconds]
Haudegen has joined #ocaml
hao has joined #ocaml
badkins has joined #ocaml
jeffmo has quit [Quit: jeffmo]
jabesed has quit [Ping timeout: 246 seconds]
ztennix has joined #ocaml
jtfmumm has joined #ocaml
tane has joined #ocaml
Haudegen has quit [Ping timeout: 260 seconds]
yomimono has quit [Ping timeout: 250 seconds]
ztennix has quit [Ping timeout: 250 seconds]
hao has quit [Ping timeout: 240 seconds]
Haudegen has joined #ocaml
Haudegen has quit [Remote host closed the connection]
MrScout has joined #ocaml
Immanuel_ has joined #ocaml
Haudegen has joined #ocaml
octachron has quit [Quit: Leaving]
<Immanuel_> I have a question related to private type abbreviations
<Immanuel_> I'm interfacing C++ and ocaml and I want to make sure that the ranges of integer types are correct
jeffmo has joined #ocaml
<Immanuel_> So I define
<Immanuel_> uint8 = private int
<Immanuel_> and int8 = private int
<Immanuel_> and the appropriate functions to do range checking...
Haudegen has quit [Remote host closed the connection]
<Immanuel_> Now I wanna check my code
<Immanuel_> for all the types I wanna use 1 checking function something like this:
<Immanuel_> let test_conversions (the_fun : int -> 't) (the_val : int) = try let the_t = the_fun the_val in Printf.printf "Numbers are %d\n" (the_t : 't :> int) with | Invalid_argument str -> Printf.printf "Error: %s" str
MrScout has quit [Ping timeout: 246 seconds]
<Immanuel_> and call that with the relevant constructor and a value to cast...
<Immanuel_> Now this doesn't typecheck because the type var 't in the signature is too general... what I need to put there is "A type coercible to int"
<Immanuel_> Is that possible?
osheeta has left #ocaml ["WeeChat 1.1.1"]
Haudegen has joined #ocaml
<companion_cube> there is no "coercible to int", you just call a function foo -> int, for any foo (if it exists)
<companion_cube> if you want a relatively safe type for uint8, for instance, you can do module UInt8 : sig type t = private int val make : int -> t option end = struct type t = int let make i = if i>=0 && i < 256 then Some i else None end
<ggole> You could do it with modules, maybe
<companion_cube> ggole: https://github.com/c-cube/ty
<companion_cube> want to join?
Haudegen has quit [Ping timeout: 272 seconds]
<ggole> companion_cube: by the way, mission success https://gist.github.com/de52c76657b523b49fae
<ggole> If you can call that succeeding
<ggole> companion_cube: so what's the goal, a reflection library for 'generic' programming in terms of 'a ty?
toolslive has quit [Ping timeout: 256 seconds]
Haudegen has joined #ocaml
<ollehar> is `ty` a keyword or something??
<companion_cube> no, it's not
<ollehar> hm no, I get it
<companion_cube> here we just define a type 'a ty
<ollehar> mhm
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
<companion_cube> the goal is to have ppx_deriving generate the definition of foo ty from the definition of foo
<ollehar> cool!
<Drup> ggole: I just said to jeremy "I don't want all the otherworldly modules leaking out in the combinator library". I think this affirmation would perfectly apply to your success.
ollehar has quit [Quit: ollehar]
<ggole> Indeed.
<ggole> I was just thinking about how to sweep them out of sight.
<ggole> But check out those annotations on Arg! Just wonderful stuff.
<Drup> ggole: did you take a look at higher ?
<companion_cube> module rec Cthulhu = ....
<ggole> I remember seeing this, but didn't go into the code
<Drup> I think it's going to be slightly similar
jtfmumm has joined #ocaml
keep_learning has quit [Ping timeout: 246 seconds]
<Drup> I'm totalling calling my new library Modhulhu.
<Drup> Oh, no, better, Functhulhu.
toolslive has joined #ocaml
BitPuffin|osx has joined #ocaml
badkins has quit [Remote host closed the connection]
malc_ has joined #ocaml
badkins has joined #ocaml
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
ztennix has joined #ocaml
AltGr has left #ocaml [#ocaml]
Haudegen has quit [Ping timeout: 255 seconds]
ceryo_ has joined #ocaml
tashjash has quit [Quit: Leaving]
Haudegen has joined #ocaml
ceryo__ has joined #ocaml
ceryo has quit [Ping timeout: 244 seconds]
voglerr has quit [Ping timeout: 252 seconds]
ceryo_ has quit [Ping timeout: 252 seconds]
creichert has joined #ocaml
Akshay has joined #ocaml
ollehar has joined #ocaml
Algebr has quit [Ping timeout: 265 seconds]
nullcat has joined #ocaml
<dmbaturin> Drup: In chicken scheme there's call-with-chulhu procedure.
<dmbaturin> * call-with-cthulhu
<Drup> :D
grouzen has quit [Ping timeout: 240 seconds]
yomimono has joined #ocaml
zpe has quit [Remote host closed the connection]
badkins has quit [Read error: Connection reset by peer]
john__ has joined #ocaml
Bhavya has joined #ocaml
dsheets has quit [Ping timeout: 250 seconds]
bobry has joined #ocaml
malc_ has quit [Ping timeout: 240 seconds]
igoroliveira has joined #ocaml
jonludlam has joined #ocaml
john__ has quit [Read error: Connection reset by peer]
Denommus has joined #ocaml
grouzen has joined #ocaml
jtfmumm has joined #ocaml
mort___ has joined #ocaml
Algebr has joined #ocaml
Algebr has quit [Remote host closed the connection]
swgillespie has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
tane has quit [Quit: Verlassend]
Bhavya has quit [Quit: Quit the channel]
sh0t has joined #ocaml
nullcat has quit [Ping timeout: 256 seconds]
Bhavya has joined #ocaml
ncthom91 has joined #ocaml
ztennix has quit [Ping timeout: 244 seconds]
ztennix has joined #ocaml
zpe has joined #ocaml
grouzen has quit [Ping timeout: 255 seconds]
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
Akshay has quit [Quit: Leaving]
ncthom91 has quit [Quit: My MacBook has gone to sleep. ZZZzzz…]
Algebr has joined #ocaml
<Algebr> Drup: Why does the after the bind in this code not execute? http://pastebin.com/bsXBj5t4
<Algebr> the code *
<Drup> Lwt_js_events.clicks will return only when the handler is canceled/terminated
<Drup> which is, in most cases, never
<Algebr> How do I cancel it, or who is the one that will receive it. Or do I need to have multiple top level Lwt.async()?
<Drup> Why would you want to cancel it ?
<Drup> It would remove the handler.
<Drup> It's fine to have multiple top level Lwt.async ()
jtfmumm has joined #ocaml
ztennix has quit [Ping timeout: 240 seconds]
badkins has joined #ocaml
Submarine has joined #ocaml
Submarine has joined #ocaml
MrScout has joined #ocaml
<Algebr> thanks
Algebr has quit [Remote host closed the connection]
grouzen has joined #ocaml
ncthom91 has joined #ocaml
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
jao has joined #ocaml
jonludlam has quit [Ping timeout: 246 seconds]
jwatzman|work has joined #ocaml
ncthom91 has quit [Quit: My MacBook has gone to sleep. ZZZzzz…]
ygrek_ has joined #ocaml
nullcat_ has joined #ocaml
jtfmumm has joined #ocaml
darkf has quit [Quit: Leaving]
aurynj has quit [Quit: Leaving]
Algebr has joined #ocaml
lewis1711 has quit [Ping timeout: 252 seconds]
ygrek_ has quit [Ping timeout: 246 seconds]
mort___ has quit [Quit: Leaving.]
Immanuel_ has quit [Quit: Page closed]
zpe has quit [Remote host closed the connection]
toolslive has quit [Ping timeout: 256 seconds]
nullcat_ has quit [Read error: Connection reset by peer]
nullcat_ has joined #ocaml
zpe has joined #ocaml
toolslive has joined #ocaml
Algebr has quit [Remote host closed the connection]
Algebr has joined #ocaml
elfring has joined #ocaml
BitPuffin|osx has quit [Read error: Connection reset by peer]
BitPuffin|osx has joined #ocaml
ygrek_ has joined #ocaml
ollehar has quit [Quit: ollehar]
ollehar has joined #ocaml
sh0t has quit [Ping timeout: 246 seconds]
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
bobry has quit [Quit: Connection closed for inactivity]
Algebr has quit [Remote host closed the connection]
MrScout has quit [Ping timeout: 244 seconds]
jonludlam has joined #ocaml
jwatzman|work has quit [Quit: jwatzman|work]
jtfmumm has joined #ocaml
sh0t has joined #ocaml
lobo has joined #ocaml
dsheets has joined #ocaml
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
xificurC has quit [Ping timeout: 255 seconds]
jtfmumm has joined #ocaml
MrScout has joined #ocaml
ncthom91 has joined #ocaml
sepp2k has quit [Quit: Leaving.]
ztennix has joined #ocaml
ztennix has quit [Ping timeout: 260 seconds]
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
manizzle has joined #ocaml
jtfmumm has joined #ocaml
tane has joined #ocaml
nullcat_ has quit [Quit: My Mac has gone to sleep. ZZZzzz…]
ollehar has quit [Ping timeout: 244 seconds]
nullcat_ has joined #ocaml
nullcat_ has quit [Client Quit]
swgillespie has joined #ocaml
magistr has joined #ocaml
<magistr> How to learn abstract nonsense?
grouzen has quit [Ping timeout: 250 seconds]
xificurC has joined #ocaml
<magistr> How to learn abstract nonsense?
<magistr> How to learn abstract nonsense?
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
<magistr> How to learn abstract nonsense?
<magistr> How to learn abstract nonsense?
MercurialAlchemi has quit [Remote host closed the connection]
MercurialAlchemi has joined #ocaml
QuanticPotato has joined #ocaml
shinnya has joined #ocaml
Kakadu has joined #ocaml
elfring has quit [Quit: Konversation terminated!]
jonludlam has quit [Ping timeout: 260 seconds]
nullcat_ has joined #ocaml
magistr has left #ocaml ["Ухожу я от вас"]
toomuchtvrotsurb has joined #ocaml
<jyc> repetition?
<dmbaturin> What is certain is that you can't learn abstract nonsense by asking about it repeatedly.
<dmbaturin> But I'm writing to a closed channel it seems.
<companion_cube> looks like a poor attempt at trolling
uris77 has joined #ocaml
uris77 has quit [Client Quit]
uris77 has joined #ocaml
swgillespie has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
igoroliveira has quit [Quit: Connection closed for inactivity]
_andre has quit [Quit: leaving]
badkins has quit []
sh0t has quit [Ping timeout: 265 seconds]
nullca___ has joined #ocaml
ceryo__ has quit [Quit: Textual IRC Client: www.textualapp.com]
Submarine has quit [Remote host closed the connection]
nullcat_ has quit [Ping timeout: 252 seconds]
jwatzman|work has joined #ocaml
kushal has quit [Quit: Leaving]
toomuchtvrotsurb has quit [Ping timeout: 244 seconds]
Bhavya has quit [Quit: Quit the channel]
zpe has quit [Remote host closed the connection]
ollehar has joined #ocaml
<tobiasBo1> flux : So I don't have any solution to put together Conduit (Ssl) and Netsmtp ?
dvb_ua has joined #ocaml
swgillespie has joined #ocaml
ygrek_ has quit [Ping timeout: 260 seconds]
RossJH has joined #ocaml
nullcat has joined #ocaml
Hannibal_Smith has quit [Quit: Leaving]
dvb_ua has quit [Ping timeout: 246 seconds]
ia0 has quit [Quit: leaving]
Haudegen has quit [Ping timeout: 244 seconds]
ia0 has joined #ocaml
nullca___ has quit [Ping timeout: 246 seconds]
ztennix has joined #ocaml
ztennix has quit [Ping timeout: 250 seconds]
Haudegen has joined #ocaml
jwatzman|work has quit [Quit: jwatzman|work]
ggole has quit []
ncthom91 has quit [Quit: My MacBook has gone to sleep. ZZZzzz…]
jtfmumm has joined #ocaml
QuanticPotato has quit [Ping timeout: 256 seconds]
Haudegen has quit [Ping timeout: 256 seconds]
BitPuffin|osx has quit [Ping timeout: 256 seconds]
Haudegen has joined #ocaml
ygrek_ has joined #ocaml
RossJH has quit [Read error: Connection reset by peer]
RossJH has joined #ocaml
jtfmumm has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
jonludlam has joined #ocaml
oscar_toro has joined #ocaml
RossJH has quit [Read error: Connection reset by peer]
jonludlam has quit [Client Quit]
jonludlam has joined #ocaml
MercurialAlchemi has quit [Ping timeout: 255 seconds]
zpe has joined #ocaml
zpe has quit [Ping timeout: 240 seconds]
QuanticPotato has joined #ocaml
swgillespie has quit [Quit: My MacBook Pro has gone to sleep. ZZZzzz…]
obadz- has joined #ocaml
obadz has quit [Ping timeout: 244 seconds]
swgillespie has joined #ocaml
swgillespie has quit [Client Quit]
mort___ has joined #ocaml
jao has quit [Ping timeout: 250 seconds]
mort___ has quit [Quit: Leaving.]
jwatzman|work has joined #ocaml
QuanticPotato has quit [Ping timeout: 244 seconds]
tane has quit [Quit: Verlassend]
jonludlam has quit [Ping timeout: 244 seconds]
QuanticPotato has joined #ocaml
Simn has quit [Read error: Connection reset by peer]
Algebr has joined #ocaml
grouzen has joined #ocaml
ygrek_ has quit [Ping timeout: 240 seconds]
TheLemonMan has quit [Quit: "It's now safe to turn off your computer."]
QuanticPotato has quit [Remote host closed the connection]
Kakadu has quit [Remote host closed the connection]
ygrek has joined #ocaml
swgillespie has joined #ocaml
ygrek_ has joined #ocaml
ygrek has quit [Ping timeout: 250 seconds]
uris77 has quit [Ping timeout: 256 seconds]
ztennix has joined #ocaml
ztennix has quit [Ping timeout: 265 seconds]
rand000 has quit [Quit: leaving]
MrScout has quit [Ping timeout: 244 seconds]
jao has joined #ocaml
rand000 has joined #ocaml
jeffmo has quit [Quit: jeffmo]
toomuchtvrotsurb has joined #ocaml
jao has quit [Ping timeout: 252 seconds]
BitPuffin|osx has joined #ocaml
ollehar has quit [Remote host closed the connection]
madroach has quit [Ping timeout: 264 seconds]
madroach has joined #ocaml
Algebr has quit [Ping timeout: 240 seconds]
nullcat__ has joined #ocaml
ztennix has joined #ocaml
Denommus` has joined #ocaml
tnguyen1 has joined #ocaml
msch_ has joined #ocaml
Sorella_ has joined #ocaml
vishesh has joined #ocaml
msch has quit [Ping timeout: 240 seconds]
Sorella has quit [Ping timeout: 240 seconds]
BitPuffin|osx has quit [Ping timeout: 240 seconds]
Denommus has quit [Ping timeout: 240 seconds]
martinium has quit [Ping timeout: 240 seconds]
Drup has quit [Ping timeout: 240 seconds]
nullcat has quit [Ping timeout: 240 seconds]
tnguyen has quit [Ping timeout: 240 seconds]
Drup has joined #ocaml
msch_ is now known as msch
martinium has joined #ocaml
lobo has quit [Quit: leaving]
Sorella_ is now known as Sorella
ncthom91 has joined #ocaml
ztennix has quit [Ping timeout: 244 seconds]
jwatzman|work has quit [Quit: jwatzman|work]
BitPuffin|osx has joined #ocaml