Aw: Re: Multiple imports on a single line

2017-02-01 Thread Marc Ziegert
I like this idea. How about some more syntactic sugar? {-# LANGUAGE ImportSugar #-} import [Data.[Text, Foldable q-as F, Vector (Vector), Vector q-as V hiding (Vector)], Control.Concurrent, Data.List q (sum)] - tree structure, one import per leaf - prefix qualified -> postfix q - qualified/as

Re: [Haskell-cafe] Proposal: new function for lifting

2013-09-28 Thread Marc Ziegert
this is a funny trick, and it looks saner than the more general $ * combinators. i see many situations where i could use that to lift my own combinators, or to replace the backticks (``) to lift the infix function. thx - marc Gesendet: Freitag, 27. September 2013 um 21:51 Uhr Von: Thiago Negri

Re: [Haskell-cafe] Alternative name for return

2013-08-06 Thread Marc Ziegert
very insightful, thx Jerzy. imho, this is a good reason not to use already known words like lift,return,inject,pure etc. while still using the word Monad. (this is something that bothered me for years.) no one -of those who say no one- does understand Monads because it does not explain itself

Re: [Haskell-cafe] Spam on list??

2013-07-02 Thread Marc Ziegert
i get this spam whenever anyone sends a mail to @eukor.com and this list at the same time. i think that this kind of spam-bot sends to all recipients, not only to the person who sent it; but sends only if it sees @eukor.com in the TO: or CC: field. so, if anyone knows a similar

Re: [Haskell-cafe] Optimal line length for haskell

2012-10-29 Thread Marc Ziegert
O_o Those are damn strange reasons to restrict oneself to 80 chars, iMho. I tend to look at ONE file at a time, on one fullscreen widescreen. 100 chars per line is more or less normal; I have my vertical line limit marker set to 100, but only for layout-zen. My lines have sometimes 200 chars

Re: [Haskell-cafe] [Haskell] mapM with Traversables

2011-09-28 Thread Marc Ziegert
Hi Thomas, this should be on the haskell-cafe or haskell-beginners mailing list. Haskell@... is mainly for announcements. You have: f :: Monad m = a - m b Data.Traversable.mapM :: (Monad m, Traversable t) = (a - m b) - t a - m (t b) So, if you define g with g

Re: [Haskell-cafe] Endian conversion

2005-10-05 Thread Marc Ziegert
you are right, that pice of code is ugly. i would write sth simmilar (Int32-[Word8]) like you did, iff it should be able to cross-compile or do not need to be fast or should not need TH. well, i think, in the case of joel's project the last sentence means ..., iff true or true or undefined. is

Re: [Haskell-cafe] Endian conversion

2005-10-03 Thread Marc Ziegert
well, fastest conversion to compute could be an assembler-command, but if we don't use that, it could be converted via Foreign.Storable and sth like the following: (i did not test it, and i hope, TH works like this...) data (Integral a) = BigEndian a = BigEndian a deriving (Eq,Ord,Enum,...) be

Re: [Haskell-cafe] Endian conversion

2005-10-03 Thread Marc Ziegert
for just making IO and a little bit-conversion, i would use c++ or even c. for such a problem you have to be near the machine, not necessarily near mathematical abstraction. there exist assembler-commands to flip endians of register-values, so i would just search in /usr/include/*/* for a

Re: [Haskell-cafe] Endian conversion

2005-10-03 Thread Marc Ziegert
nice project. (except that winonly-closedsource-thing. my condolence.) on which platform are you programming? mac? linux-ppc? i see that you understood most of that code. big-endian-test: the number 1234 has two ends (like a sausage), the end with the 1 is the big end (1000), the 4 is the

Re: [Haskell-cafe] Basic type classing question.

2005-09-21 Thread Marc Ziegert
maybe, i completely missunderstand you. please, could you program your example in another language than haskell, one you know better? i'm not sure -- did you try to define variables instead of types? data Employee = Emp data Department = Dept translated to c++ this means sth like typedef void

Re: [Haskell-cafe] Newbie syntax question

2005-09-18 Thread Marc Ziegert
map (foo 5) my_list_of_lists_of_doubles 1. map (flip foo 5) my_list_of_lists_of_doubles 2. map (`foo` 5) my_list_of_lists_of_doubles 3. map (\x-foo x 5) my_list_of_lists_of_doubles 4. [foo x 5 | x - my_list_of_lists_of_doubles] well, i've followed this discussion a while, but i did not see

Re: Stupid wuestion about Monads :)

2003-06-11 Thread Marc Ziegert
google: What the hell are Monads http://www.abercrombiegroup.co.uk/~noel/research/monads.html IO in haskell is really easy, iff you understand the sense of monads. to understand sth. like IO Bool you have to remember that i.e. an array is no defined data type without the definition of its

Re: Haskell help!

2003-03-26 Thread Marc Ziegert
on. Rachel -Original Message- From: Marc Ziegert [mailto:[EMAIL PROTECTED] Sent: Tue 3/25/2003 3:13 PM To: Weix, Rachel Lynn Cc: Subject: Re: Haskell help! maxSeq had one mistake: || instead of i will think

Re: Haskell help!

2003-03-25 Thread Marc Ziegert
looks like a genetic algorithm, i've programmed years ago. :) i need the sourcecode to solve the problem. it seems that you zip the two strings together: unzip $ zip abcde 123 - unzip [('a','1'),('b','2'),('c','3')] - (abc,123) i've no idea why you got saaturn. - marc Am Dienstag, 25. März

Re: Field labels must be globally unique?

2003-01-08 Thread Marc Ziegert
It would be nice to be able to overload class-functions like classes: instance (+), (-) - Vector where (+) v1 v2 = ... (-) v1 v2 = ... instead of overloading parts of a class... (because of runtime-errors!) instance Num Vector where (+) v1

Re: help

2002-12-10 Thread Marc Ziegert
what do you want to execute if you do not have a main function? i.e. this LHS-file: --rzsjztj ästrhü module Snoop where rjstöh gitsh schnuck :: IO () schnuck = putStr "schnuck" sdfthsrthk gumble :: IO () gumble

Re: help

2002-12-10 Thread Marc Ziegert
hey Suja@haskell.org, your mail address is faked.