mfurr changed the topic of #ocaml to: OCaml 3.08.2 available! | Archive of Caml Weekly News: http://sardes.inrialpes.fr/~aschmitt/cwn/ | A free book: http://cristal.inria.fr/~remy/cours/appsem/ | Mailing List: http://caml.inria.fr/bin/wilma/caml-list/ | Cookbook: http://pleac.sourceforge.net/
Riastrad1 has joined #ocaml
Riastradh has quit [Nick collision from services.]
Riastrad1 is now known as Riastradh
lucca has quit ["restarting emacs (hey, it happens to everyone every few months)"]
* tsume can feel it, its almost done
<tsume> :( and it segfaults
Demitar has quit ["Terminated with extreme prejudice - dircproxy 1.0.5"]
<tsume> Submarine: hmm
<tsume> Submarine: I'm not finding what I'm looking for
<tsume> Submarine: I see in mlvalues.h a commant.. /* Another special case: objects */
<tsume> Submarine: I don't see what I'm looking for however
<tsume> crap this is confusing
smkl has quit [Read error: 110 (Connection timed out)]
mbh has joined #ocaml
humasect has quit [Read error: 54 (Connection reset by peer)]
mattam has quit [Connection timed out]
vodka-goo has quit ["zZz-time"]
CosmicRay_ has joined #ocaml
vezenchio has quit ["Computer Science is no more about computers than astronomy is about telescopes"]
smkl has joined #ocaml
humasect has joined #ocaml
zzorn_afk has quit ["They are coming to take me away, ha ha"]
CosmicRay_ has quit [No route to host]
<tsume> oh... my..
<tsume> you know I never really payed any attention to this..
<tsume> ws-v3.80-9/src/ieplugin
<tsume> ws-v3.80-9/src/nsplugin
<tsume> if it can create applets, that would be something :)
<tsume> especailly if it could use them for ocaml stuff as well..
<tsume> widestudio is probably the more code advanced toolkit i've seen
<tsume> *most
<humasect> interesting
<tsume> I've been using it, but I never seen those directories because I never needed to look in the insides of WS
<tsume> i don't think its initialising correctly however, the ocamlmktop file I created keeps segfaulting
<tsume> though I wouldn't know how to use even ocaml correctly because I don't know how to properly use ocaml yet
<tsume> ony on page 75 of the book :)
<tsume> humasect: want to take a look at the not-done library which keeps segfaulting on me?
<tsume> the linkage part
<humasect> i'm playing with haskell at the moment..
<Zaius> got any inspirations from it yet?
<humasect> from haskell?
<Zaius> haskell - i found it boring when we first met. but that was long before i knew ocaml
<Amorphous> anyone can enlighten me why "break @ module line" in ocamldebug gives me "Can't find any event there." on any line i tried?
<humasect> Zaius: amazing power.
<humasect> pattern matching, infinite lists, and "pure"
<humasect> it's at least selling my focus so far.
<Zaius> whats so great for you about purity except for proving correctness
<Zaius> (which i find not great at all)
<humasect> for me? it's the mindset
<humasect> i have reasons both subjective and objective for leaning away from C
<humasect> it's not really about correctness, but about "being rather than doing" - imperative is a list of commands, things to do. spiritually it also gets me.
<humasect> still experimenting.
<Smerdyakov> "Proving correctness" and "understanding and maintaining" aren't any different if you're any good.
<humasect> yeah.. so this "correctness" thing is more about large teams, in my mind.
<humasect> or proving theorms kind of work
<Zaius> isnt it rather difficult to implement quickhacks in pure functions. like printf even.
<humasect> quickhacks? debug logging?
<Zaius> we call it 'prototyping' ;)
mlh_ has joined #ocaml
<humasect> well, first consider why prototyping is needed
<Zaius> you sound so serious...
<humasect> sorry
<humasect> i just mean.. um
<humasect> haskell is known for "a spec that is executable"
<humasect> so it is like a detailed prototype, perhaps
<humasect> looking at various parsers and such, it does look like just a specification =)
<Zaius> sometimes i think im the only one who hasnt yet built his own programming language using ocaml.
<Zaius> ah well.. i spend most of the time in the unix namespace anyway
<humasect> hm =)
tintin has joined #ocaml
mbh has quit ["leaving"]
smkl has quit [Read error: 60 (Operation timed out)]
__DL__ has joined #ocaml
__DL__ has quit [Read error: 104 (Connection reset by peer)]
smkl has joined #ocaml
mlh_ has quit [Client Quit]
humasect has quit [Read error: 104 (Connection reset by peer)]
m3ga has quit ["Client exiting"]
anyone has quit ["Few people understand understanding."]
mbh has joined #ocaml
Nutssh has joined #ocaml
smkl has quit [Read error: 60 (Operation timed out)]
smkl has joined #ocaml
Nutssh has quit ["Client exiting"]
_JusSx_ has joined #ocaml
kinners has joined #ocaml
Demitar has joined #ocaml
smkl has quit [Read error: 60 (Operation timed out)]
smimou has joined #ocaml
smkl has joined #ocaml
kinners has quit ["leaving"]
<mflux_> hmph, I wish there was 'head' and 'tail' for tuples
<mflux_> I'm trying to make functions/operators that would allow me to use it like: (init -- int -- str) 42 "str", I wonder if that's possible
<mflux_> I've come down to (init -- int -- str) (((), 42), "foo") that works, but..
<mflux_> (the source is at http://www.modeemi.cs.tut.fi/~flux/huuhaa.ml in case anyone is interested)
<mflux_> it's actually aiming for an sql query builder
<mflux_> it would be sooo neat if it you could write like let query = prepare "?0, ?1, ?2" -- (0, int) -- (1, str) -- (2, str)
<mflux_> which would then produce the function for which you could just give those three, properly typed, arguments
<mflux_> my current builder takes arguments like +% (0, Int 42) +% (1, Str "foo"), but that gives no advantage over just using a plain list argument for the preparation function (except that it can be continued)
<mflux_> well, off to bicycling, be back later to continue my ramblings ;)
zzorn has joined #ocaml
mattam has joined #ocaml
<smimou> yo mattam
mlh has joined #ocaml
Elendil has joined #ocaml
Yorick has joined #ocaml
<Yorick> #join /perl
<mattam> is #perl that funny ?
<Yorick> a new kind of typo it seems
<Yorick> but no, it is not.
_fab has joined #ocaml
<Yorick> does anyone know the inner workings of the compiler?
<Yorick> I'm trying to find out why ocamlopt generates such lousy code
<mellum> Yorick: because it doesn't do any optimizations
<mellum> well, nearly none.
<Yorick> maybe I should go and add some then :)
<Yorick> it's annoying that ordinary loops give different (and slower) code than for loops
<mellum> Well, usually, it doesn't really matter in practise.
<Yorick> that's an attitude
Elendil has quit ["Leaving"]
mbh has quit [Read error: 110 (Connection timed out)]
<mattam> what are ordinary loops if not for loops ? while's ?
<Yorick> tail calls, I thought
<Yorick> it's the most natural way to loop in ocaml, isn't it?
<Yorick> except for higher-order constructs like map
<mattam> ok
Msandin has joined #ocaml
zzorn is now known as zzorn_away
vezenchio has joined #ocaml
Msandin has quit [Read error: 110 (Connection timed out)]
gim_ is now known as gim
__DL__ has joined #ocaml
__DL__ has quit [Read error: 104 (Connection reset by peer)]
<tsume> brett glass++
tautologico has joined #ocaml
zzorn_away is now known as zzorn
Zaius has quit ["Miranda IM! Smaller, Faster, Easier. http://miranda-im.org"]
Zaius has joined #ocaml
vodka-goo has joined #ocaml
KrispyKringle has quit ["leaving"]
Zaius has quit ["Miranda IM! Smaller, Faster, Easier. http://miranda-im.org"]
KrispyKringle has joined #ocaml
Zaius has joined #ocaml
CosmicRay has quit [Remote closed the connection]
CosmicRay has joined #ocaml
smimou has quit ["?"]
pango has quit [Nick collision from services.]
pango has joined #ocaml
humasect has joined #ocaml
CosmicRay_ has joined #ocaml
CosmicRay_ has quit [Client Quit]
avn has quit [Read error: 104 (Connection reset by peer)]
avn has joined #ocaml
avn has quit [Read error: 104 (Connection reset by peer)]
tautologico has quit []
_fab has quit [Remote closed the connection]
Kleene-AAH has quit [Read error: 104 (Connection reset by peer)]
smkl has quit [Read error: 110 (Connection timed out)]
Banana has quit [Remote closed the connection]
humasect has quit [Read error: 110 (Connection timed out)]
Banana has joined #ocaml
mattam has quit [Read error: 104 (Connection reset by peer)]
mattam has joined #ocaml
CosmicRay has quit [Remote closed the connection]
vodka-goo has quit [sterling.freenode.net irc.freenode.net]
vodka-goo has joined #ocaml
nothwolf has joined #ocaml
nothwolf has quit [Client Quit]
como has joined #ocaml
zzorn is now known as zzorn_afk
smkl has joined #ocaml
mlh has quit [Client Quit]
Yorick has quit ["Leaving"]
anyone has joined #ocaml
<mflux_> hmh, I added let ( ++ ) a b = a, b and the use case became let s = (init -- int -- str -- str) (values ++ 42 ++ "foo" ++ "bar"), but I'm not sure if that's any better than what I already have ;)
<mflux_> but if that latter expression could just be 42 "foo" "bar", that'd be nice ;)
<mflux_> hm, actually as it is, just using tuples would be simpler
<mflux_> or no, it's not actually quite as flexible.. oh well, maybe it'll come to me in my sleep.
smkl has quit [Read error: 110 (Connection timed out)]
humasect has joined #ocaml
kuribas has joined #ocaml
Submarine has quit ["Leaving"]
_JusSx_ has quit ["leaving"]
CapNemo has joined #ocaml
<CapNemo> Hello
<CapNemo> someone knows a way to include a toplevel ocaml in a ocaml program to able it to evaluate ocaml expressions ?
<Riastradh> It is much more complicated than is worth the excessive hassle that shouldn't be necessary.
<CapNemo> what?
<Riastradh> Short answer: it's hard.
<CapNemo> arf
<CapNemo> that's short
<CapNemo> hard oki .. but possible no ?
<Riastradh> It's much harder than it ought to be.
<Riastradh> I don't know if it's possible to reuse the already written REPL.
smimou has joined #ocaml
mlh has joined #ocaml
smkl has joined #ocaml
Nutssh has joined #ocaml
mrvn_ has joined #ocaml
humasect is now known as FIXME
FIXME is now known as humasect
mattam has quit [Read error: 110 (Connection timed out)]
_shawn has joined #ocaml
mrvn has quit [Read error: 110 (Connection timed out)]