flux changed the topic of #ocaml to: Discussions about the OCaml programming language | http://caml.inria.fr/ | OCaml 4.00.1 http://bit.ly/UHeZyT | http://www.ocaml.org | Public logs at http://tunes.org/~nef/logs/ocaml/
mrm has quit [Ping timeout: 245 seconds]
eikke has quit [Ping timeout: 264 seconds]
awm22 has joined #ocaml
middayc has quit [Quit: Lost terminal]
mattrepl has quit [Quit: mattrepl]
yacks has quit [Ping timeout: 246 seconds]
yacks has joined #ocaml
testcocoon has quit [Ping timeout: 240 seconds]
testcocoon has joined #ocaml
madroach has quit [Ping timeout: 248 seconds]
madroach has joined #ocaml
karswell` has quit [Read error: Operation timed out]
karswell` has joined #ocaml
ollehar has joined #ocaml
ollehar has quit [Read error: Operation timed out]
emmanuelux has quit [Remote host closed the connection]
gnuvince has quit [Ping timeout: 246 seconds]
mattrepl has joined #ocaml
groovy2shoes has joined #ocaml
mattrepl has quit [Quit: mattrepl]
pkrnj has quit [Quit: Textual IRC Client: www.textualapp.com]
pkrnj has joined #ocaml
gnuvince has joined #ocaml
pkrnj has quit [Remote host closed the connection]
zen_ben has joined #ocaml
ben_zen has quit [Ping timeout: 260 seconds]
zen_ben is now known as ben_zen
breakds has quit [Quit: Konversation terminated!]
pkrnj has joined #ocaml
ttamttam has joined #ocaml
groovy2shoes has quit [Quit: Computer has gone to sleep]
chrisdotcode has joined #ocaml
Pantoufle has quit [Ping timeout: 260 seconds]
clog has joined #ocaml
anderse has joined #ocaml
eikke has joined #ocaml
gnuvince has quit [Ping timeout: 252 seconds]
Kakadu has joined #ocaml
beckerb has joined #ocaml
cago has joined #ocaml
beckerb has quit [Client Quit]
osa1 has quit [Quit: Konversation terminated!]
beckerb has joined #ocaml
ontologiae has joined #ocaml
rixed has joined #ocaml
ontologiae has quit [Ping timeout: 252 seconds]
thomasga has joined #ocaml
frogfoodeater has quit [Ping timeout: 246 seconds]
mika1 has joined #ocaml
thomasga has quit [Ping timeout: 260 seconds]
ollehar has joined #ocaml
hkBst has joined #ocaml
thomasga has joined #ocaml
cago has quit [Quit: Leaving.]
cago has joined #ocaml
eikke has quit [Ping timeout: 260 seconds]
eikke has joined #ocaml
mort___ has joined #ocaml
cago has quit [Quit: Leaving.]
Nahra has quit [Ping timeout: 256 seconds]
SanderM has joined #ocaml
ollehar has quit [Ping timeout: 260 seconds]
ontologiae has joined #ocaml
hkBst has quit [Read error: Connection reset by peer]
hkBst has joined #ocaml
hkBst has quit [Changing host]
hkBst has joined #ocaml
q66 has joined #ocaml
tootooroo has quit [Ping timeout: 256 seconds]
hkBst has quit [Remote host closed the connection]
hkBst_ has joined #ocaml
hkBst_ has quit [Changing host]
hkBst_ has joined #ocaml
hkBst_ has quit [Remote host closed the connection]
hkBst_ has joined #ocaml
hkBst_ has quit [Changing host]
hkBst_ has joined #ocaml
dsheets has joined #ocaml
ollehar has joined #ocaml
answer_42 has joined #ocaml
gnuvince has joined #ocaml
<companion_cube> is there an operator to get both the remainder and the quotient of an integer division?
<adrien_oww> not that I know of
<adrien_oww> and that probably wouldn't be very efficient
<adrien_oww> and I don't know if there's hardware support for that
<flux> adrien_oww, I think it would be, because it's a single instruction..
<adrien_oww> but you have to allocate a tuple to store the return value
<flux> well, at least on x86, what I remember of it
<flux> it would be better, though, if the compiler optimized a division and modulo into that one instruction
<companion_cube> it would be efficient if the compiler was able to unbox the tuple
<companion_cube> haskell has such an operation, I believe :/
<flux> but that doesn't seem to be happening (it divides twice)
<eikke> divMod :: Integral a => a -> a -> (a, a)
<eikke> (not sure what it compiles into)
<flux> eikke, great, but that's the wrong language :-)
<companion_cube> eikke: exactly
<flux> companion_cube, but hey, you can do this: let (/%) a b = (a / b, a mod b)
* companion_cube writing a kind of bitvector
<companion_cube> flux: would it be more efficient than computing both separatly?
<flux> maybe later rewrite it in c :)
<flux> companion_cube, no
<companion_cube> bah, never mind
<companion_cube> thanks for you help
<Cypi> Could: "let (/%) a b = let d = a / b in d, a - b*d" be more efficient?
<Cypi> (I don't think so...)
<flux> hmm, I suppose the CPU could execute the multiplication and division in parallel :)
<flux> but maybe it can execute the divisions in parallel as well
<flux> benchmark is the only way to know for sure :)
<flux> it might be faster to not use tuples, but rather like type remquot = { rem : int; quot : int }
<rixed> companion_cube: you have quomod_big_int in big_int (at least in Batbig_int)
<companion_cube> rixed: thanks, but I don't plan to use big_ints for bitvectors ;)
<rixed> companion_cube: I though so, it was just for the record :)
<eikke> I wish it was easier to add (external) primops to ocaml
tootooroo has joined #ocaml
troydm has quit [Ping timeout: 256 seconds]
mlh has quit [Read error: Connection reset by peer]
mlh has joined #ocaml
Yoric has quit [Ping timeout: 246 seconds]
Kakadu has quit [Read error: Operation timed out]
Kakadu has joined #ocaml
SanderM has quit [Read error: Connection reset by peer]
Kakadu has quit [Read error: Connection reset by peer]
mcclurmc has joined #ocaml
leoncamel has quit [Ping timeout: 256 seconds]
Kakadu has joined #ocaml
Kakadu has quit [Read error: Connection reset by peer]
Kakadu has joined #ocaml
SanderM has joined #ocaml
Kakadu has quit [Read error: Connection reset by peer]
jonafan has quit [Ping timeout: 252 seconds]
jonafan has joined #ocaml
mika1 has quit [Quit: Leaving.]
mika1 has joined #ocaml
ttamttam has joined #ocaml
mika1 has quit [Quit: Leaving.]
mika1 has joined #ocaml
zpe has joined #ocaml
adrien_o1w has joined #ocaml
troydm has joined #ocaml
adrien_oww has quit [Ping timeout: 276 seconds]
zpe has quit [Ping timeout: 256 seconds]
frogfoodeater has joined #ocaml
Yoric has joined #ocaml
cago has joined #ocaml
ollehar1 has joined #ocaml
tane has joined #ocaml
adrien_o1w is now known as adrien_oww
hkBst_ has quit [Ping timeout: 252 seconds]
hkBst_ has joined #ocaml
hkBst_ has quit [Changing host]
hkBst_ has joined #ocaml
frogfoodeater has quit [Ping timeout: 252 seconds]
ttamttam has quit [Quit: ttamttam]
awm22 has quit [Quit: Leaving.]
hkBst_ has quit [Ping timeout: 264 seconds]
sysop_fb has joined #ocaml
hkBst__ has joined #ocaml
ollehar1 has quit [Quit: ollehar1]
Neros has quit [Ping timeout: 255 seconds]
tootooroo has quit [Quit: Brain.sys has encountered a problem and needs to close. We are sorry for the inconvenience.]
tootooroo has joined #ocaml
ulfdoz has joined #ocaml
_andre has joined #ocaml
chambart has joined #ocaml
dsheets has quit [Ping timeout: 252 seconds]
Yoric has quit [Quit: Instantbird 1.4a1pre -- http://www.instantbird.com]
Yoric has joined #ocaml
zpe has joined #ocaml
Kakadu has joined #ocaml
zpe has quit [Ping timeout: 255 seconds]
mort___ has quit [Quit: Leaving.]
mort___ has joined #ocaml
thomasga1 has joined #ocaml
Yoric has quit [Quit: Instantbird 1.4a1pre -- http://www.instantbird.com]
Yoric has joined #ocaml
thomasga has quit [Ping timeout: 256 seconds]
hkBst__ has quit [Ping timeout: 246 seconds]
thomasga has joined #ocaml
hkBst__ has joined #ocaml
thomasga1 has quit [Ping timeout: 245 seconds]
ollehar has quit [Ping timeout: 256 seconds]
hkBst__ has quit [Ping timeout: 252 seconds]
ollehar has joined #ocaml
leoncamel has joined #ocaml
hkBst__ has joined #ocaml
groovy2shoes has joined #ocaml
ollehar has quit [Ping timeout: 240 seconds]
ollehar has joined #ocaml
zpe has joined #ocaml
dsheets has joined #ocaml
<bernardofpc> Cypi> Could: "let (/%) a b = let d = a / b in d, a - b*d" be more efficient? -> maybe
<bernardofpc> integer division *is* slow
<bernardofpc> but of course the problem is that you stall your pipeline
zpe has quit [Ping timeout: 245 seconds]
<olaf_> hmm, how do I 'eprintf "long message line" " continue in next source line"'? + or ^ do not work.
ollehar has quit [Ping timeout: 260 seconds]
ulfdoz has quit [Read error: Operation timed out]
<olaf_> "%s %s" may be ugly
<adrien_oww> you can escape
<adrien_oww> "foo bar \
<adrien_oww> baz bluh \
<adrien_oww> aaaa"
<adrien_oww> the leading spaces will be stripped iirc
<companion_cube> olaf_: with ^^
<adrien_oww> and also with String.concat
<adrien_oww> String.concat "" [ "your long";
<adrien_oww> "message" ]
<adrien_oww> but I'd really like to have C string literals
<adrien_oww> there's also pa_xstrp for some nice things
SanderM has quit [Remote host closed the connection]
<companion_cube> if it's eprintf, you need a format string and not just a string
<adrien_oww> "%s" (String.concat ...) :D
<olaf_> eprintf "\
<olaf_> x
<olaf_> y
<olaf_> ";
<olaf_> thats what another source file does.
SanderM has joined #ocaml
groovy2shoes has quit [Quit: Computer has gone to sleep]
frogfoodeater has joined #ocaml
weie has joined #ocaml
weie_ has quit [Ping timeout: 245 seconds]
chambart__ has joined #ocaml
chambart has quit [Read error: Connection reset by peer]
Chambart has joined #ocaml
frogfoodeater has quit [Ping timeout: 245 seconds]
jbrown has quit [Ping timeout: 256 seconds]
chambart__ has quit [Ping timeout: 252 seconds]
Kakadu has quit [Read error: Connection reset by peer]
Kakadu has joined #ocaml
ollehar has joined #ocaml
Chambart has quit [Ping timeout: 252 seconds]
Kakadu has quit [Ping timeout: 246 seconds]
Neros has joined #ocaml
mattrepl has joined #ocaml
Chambart has joined #ocaml
mika1 has quit [Quit: Leaving.]
mika1 has joined #ocaml
hkBst__ has quit [Ping timeout: 252 seconds]
mort___ has left #ocaml []
jbrown has joined #ocaml
hkBst__ has joined #ocaml
ollehar has quit [Ping timeout: 240 seconds]
hkBst__ has quit [Read error: Connection reset by peer]
hkBst has joined #ocaml
hkBst has quit [Changing host]
hkBst has joined #ocaml
Kakadu has joined #ocaml
thomasga has quit [Ping timeout: 260 seconds]
* Kakadu have tried to build ocaml+qml on ubuntu and now he hates it. Linking with Qt5 is broken
<flux> very helpful error from opam, "Fatal error: exception Not_found"
<flux> (time to update I guess)
<rixed> flux: I had this yesterday after I push -f 'ed on my git opam private repo.
<flux> well, I've done nothing of the sort, just regular user..
<rixed> flux: apparently it does n't like when the repo master branch move that way
<flux> seems to work better after upgrading opam
<rixed> flux: well, Not_found is such a common exn that may be many other things in your case of course.
<flux> rixed, indeed
dsheets has quit [Read error: Operation timed out]
dsheets has joined #ocaml
Kakadu_ has joined #ocaml
thomasga has joined #ocaml
ollehar has joined #ocaml
Kakadu has quit [Ping timeout: 276 seconds]
mixi77 has joined #ocaml
mixi77 has left #ocaml []
ttamttam has joined #ocaml
Kakadu has joined #ocaml
Kakadu_ has quit [Ping timeout: 245 seconds]
zpe has joined #ocaml
Kakadu_ has joined #ocaml
zpe has quit [Ping timeout: 252 seconds]
Kakadu has quit [Ping timeout: 260 seconds]
darkf has quit [Quit: Leaving]
Neros has quit [Ping timeout: 255 seconds]
Neros has joined #ocaml
anderse has quit [Ping timeout: 252 seconds]
anderse has joined #ocaml
noj_ has quit [Quit: leaving]
noj has joined #ocaml
ollehar has quit [Ping timeout: 255 seconds]
Neros has quit [Ping timeout: 240 seconds]
hkBst has quit [Quit: Konversation terminated!]
beckerb has quit [Quit: Konversation terminated!]
beckerb has joined #ocaml
SanderM has quit [Read error: Connection reset by peer]
thomasga has quit [Quit: Leaving.]
Kakadu_ has quit [Quit: Page closed]
<flux> does ocamlbrew try to compile in parallel?
<flux> or are there flags that could affect that behavior
Yoric has quit [Ping timeout: 240 seconds]
anderse has quit [Quit: anderse]
fraggle_laptop has joined #ocaml
Neros has joined #ocaml
<thelema_> flux: https://github.com/hcarty/ocamlbrew/blob/master/ocamlbrew#L363 <- doesn't look like it does; should be reasonable to add an option to do this
mort___ has joined #ocaml
anderse has joined #ocaml
anderse has quit [Client Quit]
weie has quit [Ping timeout: 264 seconds]
Chambart has quit [Ping timeout: 252 seconds]
UncleVasya has quit [Ping timeout: 245 seconds]
breakds has joined #ocaml
thomasga has joined #ocaml
mort___ has quit [Ping timeout: 240 seconds]
cago has left #ocaml []
mika1 has quit [Quit: Leaving.]
UncleVasya has joined #ocaml
fraggle_laptop has quit [Ping timeout: 252 seconds]
fraggle_laptop has joined #ocaml
beckerb has quit [Quit: Konversation terminated!]
beckerb has joined #ocaml
breakds has quit [Quit: Konversation terminated!]
beckerb has quit [Ping timeout: 245 seconds]
ttamttam has quit [Quit: ttamttam]
ttamttam has joined #ocaml
UncleVasya has quit [Read error: Connection reset by peer]
mcclurmc has quit [Ping timeout: 252 seconds]
ulfdoz has joined #ocaml
ousia has joined #ocaml
ontologiae has quit [Ping timeout: 252 seconds]
Kakadu has joined #ocaml
ttamttam has quit [Quit: ttamttam]
<flux> ocamlbrew failed, last lines: OPAM has already been initialized. 'opam init --no-setup' failed.
RagingDave has joined #ocaml
<josch_> hi, I have a module which one after another has functions A, B and C defined in that order. C uses A and B and B uses A so this order in the source works out. Unfortunately A and C logically belong together so it would make more sense to have A and C just one after another in the source - for the sake of easier documentation and readability.
UncleVasya has joined #ocaml
<josch_> but I can't put B before or after A,C because C uses B (so it can't be after A,C) and B uses A (so it can't be before A,C)
UncleVasya has quit [Read error: Connection reset by peer]
<josch_> is there an easy way to solve this dilemma?
<rks_> josch_: there's an ugly way
<adrien> let rec
<rks_> declare your three functions as mutually recursives
<rks_> let rec b = ...
<adrien> even though I don't like it that much
<rks_> and c = ...
<rks_> and a = ...
<rks_> (yep, me neither adrien)
<adrien> tbh it's not bad
<adrien> but don't abuse it
<adrien> use it when needed (your case) but not always
<adrien> another way is that some of your functions take a function as argument
<rks_> josch_: the other option is to use a tool dedicated to that problem (I'd guess any existing literate programming tool)
<rks_> but that's not as easy.
<adrien> making the function a parameter of another function can work quite well too ;-)
<rks_> (I'm not sure that would improve readability :))
<thizanne> using an additional fioctional parameter is certainly cleaner than a let rec :p
<josch_> yes, passing the functions around as parameters also works fine (I did that so far) but has the disadvantage of the extra (useless) parameter :)
<josch_> the let rec .. and .. in solution wouldnt work well because A, B and C are not really connected much by topic
<adrien> rks_: depends, depends
<josch_> I can also split stuff into their own modules
<adrien> josch_: it's not useless if it makes sense ;-)
<josch_> then everybody knows of the others existance beforehand
fraggle_laptop has quit [Quit: Quitte]
zpe has joined #ocaml
anderse has joined #ocaml
<pippijn> I prioritise avoiding let rec higher than logical order of functions in the source code
zpe has quit [Ping timeout: 245 seconds]
ulfdoz has quit [Ping timeout: 245 seconds]
djcoin has quit [Quit: WeeChat 0.3.9.2]
<thelema_> josch_: put them together and document together in the .mli file
dsheets has quit [Ping timeout: 246 seconds]
ulfdoz has joined #ocaml
Yoric has joined #ocaml
Neros_ has joined #ocaml
Neros has quit [Ping timeout: 240 seconds]
mcclurmc has joined #ocaml
ttamttam has joined #ocaml
ontologiae has joined #ocaml
ttamttam has left #ocaml []
Neros_ has quit [Remote host closed the connection]
ontologiae has quit [Ping timeout: 264 seconds]
dsheets has joined #ocaml
ollehar has joined #ocaml
ollehar1 has joined #ocaml
yezariaely has quit [Quit: changing servers]
_yezariaely has joined #ocaml
Neros has joined #ocaml
weie has joined #ocaml
ollehar has quit [Ping timeout: 245 seconds]
Tobu has joined #ocaml
_andre has quit [Quit: leaving]
pkrnj has joined #ocaml
awm22 has joined #ocaml
answer_42 has quit [Ping timeout: 276 seconds]
anderse has quit [Quit: anderse]
Nahra has joined #ocaml
darkf has joined #ocaml
RagingDave has quit [Quit: Ex-Chat]
thomasga has quit [Quit: Leaving.]
olaf_ has quit [Ping timeout: 248 seconds]
Snark has quit [Quit: leaving]
groovy2shoes has joined #ocaml
awm22 has quit [Quit: Leaving.]
emmanuelux has joined #ocaml
<SuperNoeMan> how can I create an empty list of a specific type?
<SuperNoeMan> like, I want a list of ityp's
<SuperNoeMan> I've defined ityp, but I want the list the I create of ityp to be empty initialiy
<companion_cube> SuperNoeMan: the empty list is 'a list
<companion_cube> but you can do let (l : int list) = [] in .... I think
<SuperNoeMan> ok
<Cypi> indeed
<SuperNoeMan> my bad
<companion_cube> (not that I see what it could be used for)
<SuperNoeMan> how dumb... I'm new to ocaml
<companion_cube> that's ok :)
<companion_cube> so, [] is 'a list, but when you build bigger lists they can have a more specific type
<SuperNoeMan> anybody install this?
<SuperNoeMan> I get a lot of errors with pathogen...
<SuperNoeMan> I'm wondering if they just left something broke in their repo or if I can't use it with pathogen
awm22 has joined #ocaml
<companion_cube> "this"?
awm22 has quit [Client Quit]
<SuperNoeMan> sorry I didn't link
<SuperNoeMan> companion_cube:
<companion_cube> ah
* companion_cube uses merlin now
Kakadu has quit []
<companion_cube> (which works with pathogen)
<rks_> :D
<rks_> SuperNoeMan: that thing is a bit outdated
<SuperNoeMan> oh wait...
<rks_> recently merlin (completion, syntax + type checking on the fly) and ocp-indent (indentation, no kidding) have been released
<rks_> and you probably want to use that
ontologiae has joined #ocaml
<rks_> that doesn't cover everything that is in the repo of course
<SuperNoeMan> yeah I was wondering what everybody was using for vim. All the ocaml plugins I could find for vim sucked
<rks_> (notably it doesn't cover the "go to definition")
<SuperNoeMan> ok
<SuperNoeMan> so... how should I go about installing merlin, given what you're telling me rks?
<rks_> hell yeah :)
groovy3shoes has joined #ocaml
<rks_> (it's available in opam)
<companion_cube> goto definition is doable with otags
<SuperNoeMan> well, should I use opam or pathogen?
<companion_cube> (more or less)
<rks_> ( and here https://github.com/def-lkb/merlin if you don't have opam )
<SuperNoeMan> I have opam
<rks_> companion_cube: it's probably better to use ocamlspotter for that
<companion_cube> hmm hmm
<companion_cube> does it produce TAGS files?
<rks_> (opam is fine)
<companion_cube> hm, reminds me that I don't have the new opam shell completion files :/
<rks_> (it will be loaded through pathogen)
<SuperNoeMan> rks_: opam will install to my ~/.vim directory?
<rks_> SuperNoeMan: I think so, let me check
<SuperNoeMan> well I prefer pathogen...
<SuperNoeMan> is there anything that I'm missing if I use pathogen? it sounded like you said the github repo located here: https://github.com/def-lkb/merlin
<SuperNoeMan> wasn't as up to date...
<rks_> SuperNoeMan: opam will let you ocamlmerlin/vim iin the share dir of your switch
groovy3shoes has quit [Client Quit]
<rks_> which you can then copy in your .vim/bundle (and load with pathogen)
groovy2shoes has quit [Ping timeout: 264 seconds]
<SuperNoeMan> I didn't know "let you ocamlmerlin/vim iin the share dir of your switch" was an action...
<rks_> let you an*
<SuperNoeMan> I still don't know what you mean
<SuperNoeMan> is english your first language? it sounds like you're saying that opam will leverage pathogen
<rks_> well SuperNoeMan, if you do « opam install merlin » in your .opam/your-switch/share
<rks_> you will find a directory called "ocamlmerlin" with a subdirectory called "vim" which can be used as a pathogen bundle
<SuperNoeMan> should I just use a symlink?
<rks_> sounds fine to me.
ulfdoz has quit [Ping timeout: 245 seconds]
<rks_> (btw SuperNoeMan, the repo you linked said to use https://github.com/MarcWeber/vim-addon-manager if you wanted his "ocaml-addon")
tane has quit [Quit: Verlassend]
pkrnj has quit [Quit: Computer has gone to sleep.]
<SuperNoeMan> oh
ousado has quit [Ping timeout: 245 seconds]
<SuperNoeMan> rks_: yeah, sorry I guess I was kinda playing around with a lot of different ocaml plugins, I was reading the info on most, but lost track
<SuperNoeMan> man alive
<SuperNoeMan> why does literally every ocaml plugin have an annoying bug where whenever doing a match statement, it gets the placement of the | wrong
<SuperNoeMan> unless one has already been placed. It doesn't probably decide which set of | to line up with
ousado has joined #ocaml
<rks_> SuperNoeMan: ocp-indent does that well
<rks_> (unfortunately, ocp-indent doesn't do "on the fly" indenting in vim at the moment... i think)
ontologiae has quit [Ping timeout: 240 seconds]
Yoric has quit [Ping timeout: 240 seconds]
<SuperNoeMan> ocp-indent?
<SuperNoeMan> just found it...
<SuperNoeMan> boy it sure would be nice if it did it on the fly better
<rks_> yes
<rks_> but that should be available in the (near) future
<companion_cube> but it's hard to decide what to align the | with
<SuperNoeMan> companion_cube: in the case where match blocks are encapsulated with parenthesis it shouldn't be...
<companion_cube> why?
<companion_cube> I mean, do you indent at the level of the "match" statement, or one indentation unit further, ...?
<SuperNoeMan> well, usually, I have a match statement with the first with on the same line
<SuperNoeMan> match x with (one, two) ->
<SuperNoeMan> first action
<SuperNoeMan> (* supposed to be 2 spaces before first, but its not showing it on my irc client *)
<SuperNoeMan> | second match expression
<SuperNoeMan> so that the s of second matches up with the f of first
<SuperNoeMan> later on, in a separate block, if I have a separate match case
<companion_cube> oh
<SuperNoeMan> I type the first | and it gets matched to the match case with first and second
* companion_cube always puts |, even for the first case
<SuperNoeMan> gets matched -> gets aligned
pkrnj has joined #ocaml
smerz has joined #ocaml
cdidd has quit [Read error: Connection reset by peer]
mattrepl has quit [Quit: mattrepl]
rwmjones has quit [Ping timeout: 245 seconds]
frogfoodeater has joined #ocaml
q66 has quit [Read error: Connection reset by peer]
emmanuelux has quit [Remote host closed the connection]
milosn_ has joined #ocaml
milosn has quit [Ping timeout: 252 seconds]
rwmjones has joined #ocaml
sysopfb has joined #ocaml
sysop_fb has quit [Read error: Connection reset by peer]
IbnFirnas has quit [Read error: Operation timed out]
IbnFirnas has joined #ocaml
flux has quit [Read error: Connection reset by peer]
IbnFirnas has quit [Changing host]
IbnFirnas has joined #ocaml
flx_ has joined #ocaml
flx_ is now known as flux
frogfoodeater has quit [Ping timeout: 256 seconds]
<SuperNoeMan> the accumulator in list.fold_left doesn't have to have 'a type of 'a list that's passed to it does it?
<thizanne> no
<SuperNoeMan> well then I don't understand the error that I'm getting...
<thizanne> List.fold_left (fun acc e -> if e then acc + 1 else acc) 0 [true; false; true; true]
<SuperNoeMan> thizanne: would you be willing to look at my code?
<SuperNoeMan> i'm looking at fold_left
<thizanne> paste it somewhere
<SuperNoeMan> thizanne: you only have to look at the typchk_expr
<SuperNoeMan> to know whats going wrong, or so I think anyway...
<SuperNoeMan> let me paste the compiler output
<SuperNoeMan> the error occurs at
frogfoodeater has joined #ocaml
<SuperNoeMan> more complete error: http://codepad.org/RwlRg2of
breakds_ has joined #ocaml
<thizanne> well... :D
<SuperNoeMan> thizanne: do you need the other parts of it?
<SuperNoeMan> I mean, I thought what I was doing in this piece of code was passing in a bool ETypErr and empty list to the fold left accumulator...
<SuperNoeMan> what am I doing wrong?
<thizanne> acn you paste imptypes ?
<thizanne> so far i cant see what is wrong, but this is a really dense piece of code for 2am so I might not see really good