gt; down the old server on Jan 31, 2011. Hopefully this will give everyone
> adequate time to move their files.
Oh, for goodness' sake. Put a tarball somewhere and I'll put up a
mirror for the laggards. It can stay there for years for all I care.
--
Taral
"Please let me know if
, and you're the only one complaining like this. Take a backup
of the site with wget and fix it when you have time.
--
Taral
"Please let me know if there's any further trouble I can give you."
-- Unknown
___
Haskell m
On Sat, Mar 21, 2009 at 10:00 AM, Don Stewart wrote:
> Util/Gen.hs:6:7:
> Could not find module `Control.Monad.Identity':
> it was found in multiple packages: transformers-0.1.1.0 mtl-1.1.0.2
> make[1]: *** [jhc] Error 1
ghc-pkg hide transformers-0.1.1.0
--
Taral
&q
lysis. While
Haskell provides assertions that t is an instance of B (B t), it does
*not* provide assertions that t is not an instance of B. This is
because an instance of B can be declared by other modules at a later
point (e.g. by someone who imports your module).
--
Taral <[EMAIL PROTECTED]&
gt; in x
> server _ = error "... invalid request ..."
Not the same fallthrough properties. You'd have to clone the "server
_" clause into the x clause.
--
Taral <[EMAIL PROTECTED]>
"Please let me know if there's any further trouble I can give you.&q
decided to evaluate y before the
> writeIVar. What's to prevent it doing that?
Look at the translation:
newIVar >>= (\x -> let y = readIVar x in writeIVar x 3 >> print y)
y can't be floated out because it depends on x.
--
Taral <[EMAIL PROTECTED]>
,
Haskell is made into a significantly more useful programming language.
--
Taral <[EMAIL PROTECTED]>
"Please let me know if there's any further trouble I can give you."
-- Unknown
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
On 7/12/07, Doug McIlroy <[EMAIL PROTECTED]> wrote:
http://www.cs.dartmouth.edu/~doug/powser.html
Very nice. I would only recommend that you include:
scale k f = map (k*) f
and have (*) use it. Thanks for your contribution!
--
Taral <[EMAIL PROTECTED]>
"Please let me kn
s always a blast
reading about the interesting things everyone else is up to.
Hear, hear. Thank you very much Andres!
--
Taral <[EMAIL PROTECTED]>
"Please let me know if there's any further trouble I can give you."
-- Unknown
___
Has
are developing applications for Mac, you need
to know the OS. And the OS is a UNIX.
On 5/20/07, Taral <[EMAIL PROTECTED]> wrote:
You need to install Xcode (from your Mac OS disk) before you can use ghc.
--
Taral <[EMAIL PROTECTED]>
"Please let me know if there'
ns, it complains that I don't have a gcc on my
machine...
--
Taral <[EMAIL PROTECTED]>
"Please let me know if there's any further trouble I can give you."
-- Unknown
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
s very time consuming.
I personally recommend to people that if sections of your code are
really performance-critical, you should consider writing them in a
lower-level lanaguage like C and using FFI for access.
P.S. I wonder if jhc could improve the output code?
--
Taral <[EMAIL PROTECTED]>
(These sets may continue to grow.)
Congratulations to all the students.
Darcs Con[f]lict Handling
Yay!
Rewrite the typechecker for YHC and nhc98
Yay again!
Update the Hat tracer
YAY!
Ok done now. :D
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
On 3/13/07, Taral <[EMAIL PROTECTED]> wrote:
This is closer, but still doesn't work:
And this works, and I don't know why:
class MonadTrans' i o where
lift' :: (Monad i, Monad o) => i a -> o a
instance Monad m => MonadTrans' m m where
lif
On 3/13/07, Taral <[EMAIL PROTECTED]> wrote:
And it doesn't work. I know what I want it to do, how do I express it right?
This is closer, but still doesn't work:
class (Monad i, Monad o) => MonadTrans' i o where
lift' :: i a -> o a
instance Monad m =>
;
And it doesn't work. I know what I want it to do, how do I express it right?
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
nfo/haskell
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
On 3/1/07, Dave Tapley <[EMAIL PROTECTED]> wrote:
My question asks why this is the case, when laziness should ensure only the
first 10 cases need to be computed.
Basically, because the IO monad is strict, not lazy. If you want
laziness, don't use the IO monad.
--
Taral <[E
contents <- IO.hGetContents handle
let len = length contents
seq len $ IO.hClose handle
return $ XP.xmlParse fn contents
This works, because to get the head of len (an integer) you need the
whole of contents.
--
Taral <[EMAIL PROTECTED]>
"Y
On 12/19/06, mm <[EMAIL PROTECTED]> wrote:
i'd like to inform you about the first announced version of CalDims.
Its website is in the haskellwiki:
http://www.haskell.org/haskellwiki/CalDims
Neat! It's like "units", but in Haskell.
--
Taral <[EMAIL PROTECTE
that they *will* be delivered, just that
they can. If you need to *wait* for an asynchronous exception, then
you shouldn't be using them at all.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
_
WASH should be. Mine's not really anything I'm proud enough of to
document. :) It needs rewriting with a parsing monad and some
cleanups. MIME/Util.hs is particularly heinous.
--
Taral <[EMAIL PROTECTED]>
"You can't prove an
d work on that code instead.
WASH has one, and I uploaded mine to http://www.taral.net/mime.tar.gz
for people to look at and use.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
sed? If the length is increased? It's possible
that the array approach wins when you try to process 100,000 elements.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mai
You do need O(1) random access for the writers to put their results in
efficiently. And newArray_ should be faster than N copies of
newEmptyMVar. It is true that I have one congestion point (the
semaphone) instead of N (the mvars).
--
Taral <[EMAIL PROTECTED]>
"You can't pro
y? The IO monad is strict, so the computations should be
done in parallel...
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
On 10/21/06, Audrey Tang <[EMAIL PROTECTED]> wrote:
> let proc n x = do
Hmm, am I missing something here, but how does forkIO (and data
parallelism) fit in into that scheme?
I R DUM.
let proc n x = forkIO $ do
--
Taral <[EMAIL PROTECTED]>
"You can't prove
alQSemN count 1
sequence_ $ zipWith proc [0..] xs
waitQSemN count l
elems $ unsafeFreeze arr
STM might work better than a QSemN...
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
t to write a Read instances for it.
Can you define instance Cxt a => Read (Box a)? If not, then you need
typecase and Haskell does not really support that.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
__
On 9/20/06, Niklas Broberg <[EMAIL PROTECTED]> wrote:
It is much easier to keep conversations in context in a forum, and to
search for old conversations. It's all there, all the time.
Eh, I don't have this problem. I use gmail.
--
Taral <[EMAIL PROTECTED]>
&qu
ts. Plenty of
popular languages out there with no web forum.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
e left-hand side...
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
On 9/8/06, Bill Wood <[EMAIL PROTECTED]> wrote:
We await the response with bated breath.
Don't hold your breath.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Has
ef a -> IO a
setDynamicRef :: IODynamicRef a -> a -> IO b -> IO b
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
; FunPtr Callback -> IO ()
You get that FunPtr by the import/export trick described by Anatoly or
you can just construct the FunPtr in main or an unsafePerformIO CAF.
(We need a constructor syntax for top-level objects requiring IO!)
--
Taral <[EMAIL PROTECTED]>
"
On 7/19/06, Stefan Karrmann <[EMAIL PROTECTED]> wrote:
Unfortunatly, darcs does
not provide a method to extract patches as far as I know. (Hints are
welcomed.)
darcs diff and darcs annotate.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- G
back)
foreign export "free_fcn" free_fcn :: Callback
free_fcn sp = do
(cb, ds) <- deRefStablePtr sp
freeStablePtr sp
freeHaskellFunPtr cb
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
__
On 7/12/06, Taral <[EMAIL PROTECTED]> wrote:
Because atomically doesn't like unsafePerformIO.
In more detail: "atomically" is not re-entrant. You could try something like:
main = a `seq` do ...
to make sure that you don't re-enter the STM subsystem and crash.
O.
For TVars there's newTVarIO, but I'm not sure about TMVars.
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
the use of generics, subclassing,
and virtual dispatch. However, ..."
Am I the only one whose first instinct upon reading this is "EW!"?
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
I just printed this out and started reading it -- it is an
impressive work with some *very* interesting projects I had no idea
were out there! Thank you!
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
-- Gödel's Incompetence Theorem
__
On 5/28/06, Dominic Steinitz <[EMAIL PROTECTED]> wrote:
Is this defined in some library? Thanks, Dominic.
Don't think so. I use:
\a b -> f (g a b)
--
Taral <[EMAIL PROTECTED]>
"You can't prove anything."
strange. What appears to have been overlooked is that
different people will execute these commands differently:
./configure --prefix=/opt/freeware --sysconfdir=/etc --disable-nls
make
make install DESTDIR=/home/taral/staging
Many people will run "make install" as root but the main
On 5/20/06, Bas van Dijk <[EMAIL PROTECTED]> wrote:
simplifyExp (HsLeftSection e op)= HsApp (opToExp op) e
simplifyExp (HsRightSection op e) = HsApp (opToExp op) e
By the way, I think this looks wrong. One of these needs to create a
lambda expression.
--
Taral <[EMAIL
e:
everywhere (mkT (simplify :: HsExp -> HsExp))
. everywhere (mkT (simplify :: HsPat -> HsPat))
. everywhere (mkT (simplify :: HsRhs -> HsRhs))
Of course, that's not any simpler.
--
Taral <[EMAIL PROTECTED]>
"You can't pr
l ghc on your system, but I can assure
you that the apple hardware test does not test your RAM to the extent
required to detect this error. Such a test would take several hours.
--
Taral <[EMAIL PROTECTED]>
"Computer science is no more about computers than astronomy is about
tele
On 3/15/06, Christopher Brown <[EMAIL PROTECTED]> wrote:
> Taral,
>
> What is a bit-0 error? and how do I find out if I have bad RAM?
> >> /tmp/ghc24547.s:22969:Invalid mnemonic 'mtcts'
> >> /tmp/ghc24547.s:103127:Invalid mnemonic 'mtcur'
x27;mtcts'
> /tmp/ghc24804.s:unknown:Undefined local symbol L___DISCARE__$stub
All bit-0 errors. Do you have bad RAM, perhaps?
--
Taral <[EMAIL PROTECTED]>
"Computer science is no more about computers than astronomy is about
telescopes."
-- Edsger Dijkstra
___
On 3/13/06, Asfand Yar Qazi <[EMAIL PROTECTED]> wrote:
> 42: type NumSamples = ALCsizei
> 109: type ALCsizei = HTYPE_ALCSIZEI
>
> A C header file has the entry '#define HTYPE_ALCSIZEI Word32'.
I suspect ALCint is not Word32.
--
Taral <[EMAIL PROTECTED]>
ght depend
> on its argument. then I could do something like:
GHC uses ST, which uses RealWorld#...
--
Taral <[EMAIL PROTECTED]>
"Computer science is no more about computers than astronomy is about
telescopes."
-- Edsger Dijkstra
at is not allowed.
You have to CPS it:
withUnliftIO :: ((forall a. m a -> IO a) -> m a) -> m a
--
Taral <[EMAIL PROTECTED]>
"Computer science is no more about computers than astronomy is about
telescopes."
-- Edsger Dijkstra
___
H
On 1/5/06, Cale Gibbard <[EMAIL PROTECTED]> wrote:
> class Applicative m => Monad m where
> m >>= f = join (map f m)
>
> instance PointedFunctor m where
> require return
> map f x = x >>= (return . f)
Um, it looks like map and (
ance WellTyped Nil
> instance WellTyped cs => WellTyped ((a :=: a) :+: cs)
> instance (WellTyped cs1, WellTyped cs2) => WellTyped (cs1 :@: cs2)
Could one not write:
instance WellTyped (a :=: a)
and do away with (:+:)?
--
Taral <[EMAIL PROTECTED]>
"Computer science is no mor
; might be generate something like this:
>
> HsBool foo (CDict dict,int32 x) { ... }
Just a strange thought, but what about...
foo :: x# -> ...
=>
... foo (void *x, ...) { ... }
Just because it's unboxed doesn't mean it isn't in memory...
--
Taral <[EMAIL PROTECTED]&
a <- replicateM (rangeSize b) (newTVar arrEleBottom)
return $ TArray (listArray b a)
unsafeRead (TArray a) i = readTVar $ unsafeAt a i
unsafeWrite (TArray a) i e = writeTVar (unsafeAt a i) e
instance HasBounds TArray where
bounds (TArray a) = bounds a
--
Taral <[EMAIL PROTE
" rule: at each point,
> the longest possible lexeme satisfying the lexeme production is read.
Since the "whitespace" production is not included as part of the
"lexeme" production, maximal munch must not apply to comments.
--
Taral <[EMAIL PROTECTED]>
"Computer sci
On 12/8/05, Taral <[EMAIL PROTECTED]> wrote:
> or b) comment, because the maximal munch rule says so (it matches the
> newline):
>
> comment -> dashes [any {any}] newline
> varsym -> (symbol {symbol | :})
Aha. Maximal munch only applies to non-whitespace, so Hugs is ri
symbol {symbol | :})
GHC says comment. Hugs says varsym. What's the answer?
--
Taral <[EMAIL PROTECTED]>
"Computer science is no more about computers than astronomy is about
telescopes."
-- Edsger Dijkstra
___
Haskell mailing list
Haskell@haskell.org
http://www.haskell.org/mailman/listinfo/haskell
58 matches
Mail list logo