> :step
Stopped at bla1.hs:5:17-19
_result :: Int = _
x :: Int = 3
[bla1.hs:5:17-19] *Main> :step
0
*Main>
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
ndeed. I guess I should have tried compiling my example. I have
the urge to post my solution to that exercise just so you know I did
it right :-) I'm about to post an SOE question separately.
peace,
Isaac
___
Haskell-Cafe mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell-cafe
Expressions or
Variables to keep the type-checking but decrease the verbosity?
peace,
Isaac Jones
___
Haskell-Cafe mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell-cafe
th the ones I use the
most.
peace,
Isaac
_______
Haskell-Cafe mailing list
[EMAIL PROTECTED]
http://www.haskell.org/mailman/listinfo/haskell-cafe
) = flip onDoneR (runR i) $ \r ->
case r of
Done a _-> Fail e (Just a) c
Fail e' a _ -> Fail e' a c
_ -> error "joinR"
Where the 'runR'
gt;
> The bottomline: the biggest advantage I see right now in favor of
> iterIO is c),
I basically agree with this list, but think you are underestimating
the value of a. I would rank a as the most important difference
between the packages. (a also is the reason for d.)
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
perience to do it on my own. Suggestions and help are of course
welcome...
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
the old names were much worse,
especially since Enum is a fundamental typeclass that has absolutely
nothing to do with enumerators.
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
stand how to
use unix-compat, though. It gives me calls like
getFdStatus :: Fd -> IO FileStatus
which is one of the things I need. But how do I get an Fd in the
first place? (unix-compat seems to have no equivalent of openFd.)
David
___
Hask
es for Enumerator/Iteratee?
If there's overwhelming consensus, I would certainly consider changing
the names in the iterIO library, but it's a pretty big change...
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
;, which will actually end up increasing the amount of
stuff in contexts.
(Of course, (Iter t m) itself is an Applicative Functor, even when m
is just a Monad. So that I make use of in the parsing module.)
David
___________
Haskell-Cafe mailing list
Haskell
ialQuantification #-}
{-# LANGUAGE GADTs #-}
data Showable a = forall a. (Show a) => Showable a
data AV t where
AVLeft :: AV (Showable a) -> AV (Either (Showable a) b)
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
r pipeline stages can actually
un-transcode data to make this true across data types). But that's
also what makes downstream control messages are harder, because
there's no way to represent exceptions at particular points in the
input stream, just an EOF marker at the very end.
> I like the MonadTrans implementation a lot...
Thanks,
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
to
write:
bracket before after thing = do
a <- before
thing a `finallyI` after a
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
to
write:
bracket before after thing = do
a <- before
thing a `finallyI` after a
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
ock the memory
bus? Or is there some other reason unsafeUnmask could become
expensive on NUMA machines, or in the presence of concurrency?
Thanks,
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
cy.
The reason I'm asking is that I want to make sure I never end up
having to pay the overhead of an MFENCE instruction or equivalent
every time I use unmaskAsyncExceptions#...
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
(if the first 7 are digits).
So what I'm stuck on is figuring out the right way to sequence the
downstream requests with respect to the input data, particularly when
you have enumeratees transcoding from one type to the other. Any
thoughts?
Thanks,
David
_______
e, if you had my definition of IORef, but data races
are by far the most pernicious concurrency problems.) Of course, the
key to making Haskell useful in a parallel setting is that things like
the memory model have to be fully specified...
Thanks,
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
ain barrier
instructions, it could be that memoIO is simply correct and the blog
post is simply wrong about needing MVars.
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
afety is guaranteed by the types
(modulo some unsafe stuff I hope will be even easier to detect with
ghc 7.2...). But for that last little bit of tricky code, the best
you can do is specify the behavior of the building blocks and maybe
provide some useful architecture-independent wrap
low for truly wait-free data types. (That might not be possible
without sacrificing referential transparency, since the obvious
implementation would involve comparing pointers rather than values.)
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
kConst_r)'
In the expression: unConst (mkUnit mkConst_r)
I've found several workarounds for the issue, but I'd like to
understand what the error message means and why it is caused by GADTs.
Thanks in advance for any help.
David
___
m number of extensions possible to
future-proof my code. However, is it reasonable to conclude that if
I'm going to use GADTs anyway, then additionally enabling
ScopedTypeVariables doesn't really make my code any less future-proof?
Thanks,
David
__________
ntations and interfaces, and will introduce more
> dependencies. So my instinct is to stick with the worse-is-better
> approach, but I'm willing to be educated.
I fully agree with the point about dependencies and waiting for the
dust to settle, though I hope a lot of that changes in a
inding", I would appreciated it, particularly if you
can point to support for your definition in the Haskell 2010 report...
Thanks,
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
then show x else g2 y x
g2 p q = g1 q p
in ...
This example is very close to the code I gave. How can my example
have two declaration groups when this example has only one?
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
y variable
in the group..." they have to be thinking there may be more than one
of them.
> The type of g1 is inferred using the declared type of g2. Then that
> type is used in inferring a type for g2, which will be compared with
> its declared signature.
Thanks for the
uld instead read:
(a): every binding is a function binding, or
(b): the group consists of a simple pattern binding with an
explicit type signature.
In particular, why would the report say "an explicit type signature is
given for EVERY variable" when there can be only one such variable?
David
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
t they meant:
b1 contains a free identifier that is bound by b2 and b2 is
accompanied by a type signature for that identifier
I think, given the ambiguities here, it's worth filing a ticket on the
haskell' web site.
Thank you.
David
____
r, but it might make more sense to discuss on
haskell-prime.
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
to horrible as-is is that enumFile
is already a convenience function effectively combining openFile with
enumHandle.
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
At Wed, 29 Jun 2011 21:13:47 +1000,
John Ky wrote:
>
> Hi Haskell Cafe,
>
> I've written an echo server using just sockets:
>
> ...
>
> When I send text to it, it will echo it back immediately after my newline.
>
> I then modified it to user IterIO:
struction function that doesn't
automatically do things like loop or handle EOF conditions.
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
haskell.org/package/iterIO (my 3rd-generation attempt)
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
hose only purpose is to bring a type
variable into scope. But both of those are probably more future-proof
than -XNoMonomorphismRestriction.
David
___________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
At Mon, 4 Jul 2011 20:36:33 +1000,
John Ky wrote:
>
> Hi Haskell Cafe,
>
> enum |$ inumLines .| inumReverse .| inumUnlines .| iter
> ...
>
> iterLines :: (Monad m) => Iter L.ByteString m [L.ByteString]
> iterLines = do
> line
of deriving
Typeable1.
David
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
dition.
Version: 7.1.362 / Virus Database: 267.13.12/192 - Release Date: 05.12.2005
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
anyway.
My question is - and this might better suit to Haskell -, can't uniqueness be
inferred (and exploited) automatically in
many cases?
Regards,
zooloo
--
No virus found in this outgoing message.
Checked by AVG Free Edition.
Version: 7.1.371 / Virus Database: 267.13.12/19
.1.371 / Virus Database: 267.13.12/192 - Release Date: 05.12.2005
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
ition.
Version: 7.1.371 / Virus Database: 267.13.12/192 - Release Date: 05.12.2005
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
and elegant code, even if it is inefficient!
Best regards
Tomasz
--
I am searching for a programmer who is good at least in some of
[Haskell, ML, C++, Linux, FreeBSD, math] for work in Warsaw, Poland
___________
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
I'm wrong): Hacle does not even make
use of uniqueness typing (apart from *World
and *File), so any benefits are due to other differences, like, inferred
strictness.
Regards,
zooloo
--
No virus found in this outgoing message.
Checked by AVG Free Edition.
Version: 7.1.371 / Virus Databa
ld still
> have no uniqueness types but the compiler would infer uniqueness types
> internally and use the uniqueness information it gets from this.
>
Right, that's what I was having in mind. See also
http://www.haskell.org/pipermail/haskell-cafe/2005-December/012625.html
Regards,
zoo
this outgoing message.
Checked by AVG Free Edition.
Version: 7.1.371 / Virus Database: 267.13.12/192 - Release Date: 05.12.2005
_______
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
sender.
p.p.s.: I've sent this mail a second time because the first one got lost
somehow - hopefully, it doesn't show up again.
--
No virus found in this outgoing message.
Checked by AVG Free Edition.
Version: 7.1.371 / Virus Database: 267.13.12/192 - Release Date: 05.12.2005
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
n Clean.
My english understanding skills failed me here. Could you expand this
sentence using simpler words?
Best regards
Tomasz
--
I am searching for a programmer who is good at least in some of
[Haskell, ML, C++, Linux, FreeBSD, math] for work in Warsaw, Poland
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe
again (after more than 5
hours), whilst another, later message of mine was posted within minutes! Sorry
everyone for the inconvenience.
--
No virus found in this outgoing message.
Checked by AVG Free Edition.
Version: 7.1.371 / Virus Database: 267.13.12/192 - Release Date: 05.12.2005
ve. Anyone knows why?
>
> Maybe mailman is somehow confused by this weird address:
> "xoxy >>= haskell-cafe" <[EMAIL PROTECTED]>
> ?
> Relevant headers of this message:
> [...]
>
> Looks like gourmet.spamgourmet.com resends to haskell-cafe@haskell.org
&g
50 matches
Mail list logo