[Haskell-cafe] Upgrading Arch Linux Haskell Packages

2010-01-08 Thread Cetin Sert
Hi, Is there a way to manually upgrade Haskell packages in the aur repository of Arch Linux which were previously contributed automatically by arch-haskell? Or is there a batch upgrade planned for the near future? What is the mailing list for arch Best Regards, Cetin

Re: [Haskell-cafe] Re: [arch-haskell] Upgrading Arch Linux Haskell Packages

2010-01-08 Thread Cetin Sert
Even while having a break he's blazing fast with his replies! 2010/1/8 Ivan Lazar Miljenovic ivan.miljeno...@gmail.com Don Stewart d...@galois.com writes: There's a batch upgrade, I've just been travelling! Yeah, let Don have a break for once! Oh, since you're here Don, how do I do

Re: [Haskell-cafe] Re: [ANN] text 0.7, fast Unicode text

2009-12-15 Thread Cetin Sert
http://corsis.sourceforge.net/img/csharp-6.png http://corsis.sourceforge.net/img/csharp-6.pngo__O!? 2009/12/16 Bryan O'Sullivan b...@serpentine.com On Tue, Dec 15, 2009 at 8:03 PM, Ashley Yakeley ash...@semantic.orgwrote: How do you pack Unicode codepoints into Word16? Do you use UTF-16?

[Haskell-cafe] Plot data reconstruction reading pixel colors from image files

2009-07-17 Thread Cetin Sert
Hi, How can I open and read colors of specific pixels of an image file in Haskell? Which packages, functions do you recommend? You can have a look at the quoted conversation for an idea on what I would like to automate. Best Regards, Cetin Sert Hi dear *^o^*, Here are the points from

[Haskell-cafe] Flow Graphs for Language-independent Code Representation

2009-07-04 Thread Cetin Sert
references are most welcome! Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Happy GLR mode build failures

2009-07-01 Thread Cetin Sert
for this? The irrefutable pattern failure issue is especially bothersome for me as I ran into it in a Fortran grammar I'm writing and got stuck. Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo

[Haskell-cafe] System.Vacuum.Ubigraph

2009-06-26 Thread Cetin Sert
not exist (No such file or directory)) In ubigraph.clear: �: openFile: the part between clear and openFile is not always the same character or sequence of characters! I guess it's a problem with Network.XmlRpc.Client but couldn't locate it. Anyone else that has (had) this problem? Best Regards, Cetin

[Haskell-cafe] Generate Fortran 77 parser from a yacc grammar using Happy

2009-06-23 Thread Cetin Sert
I have stumbled upon the following F77 yacc grammar: http://yaxx.cvs.sourceforge.net/viewvc/yaxx/yaxx/fortran/fortran.y?revision=1.3view=markup . How can I make a Fortran 77 parser out of this file using Happyhttp://www.haskell.org/happy/ ? Why is there some C?/C++? code in that .y file?

[Haskell-cafe] ANNOUNCE: clock 0.1 released

2009-06-15 Thread Cetin Sert
. It was implemented in response to a haskell-cafe discussion: http://www.mail-archive.com/haskell-cafe@haskell.org/msg51244.html Any suggestions for improvement, bug-fixes, joint-development offers are most welcome *^o^*!! Cetin Sert ___ Haskell-Cafe mailing list

[Haskell-cafe] specialization in type classes

2009-06-05 Thread Cetin Sert
module IOStream where import System.IO import System.IO.Unsafe class Out a where out :: a → String instance Show a ⇒ Out a where out = show instance Out String where {-# SPECIALISE out :: String → String #-} out = id instance Out Char where {-# SPECIALISE out :: Char → String #-}

[Haskell-cafe] Re: specialization in type classes

2009-06-05 Thread Cetin Sert
Now there's also a stackoverflow question for this: http://stackoverflow.com/questions/955711/specialization-in-type-classes-using-ghc Any help highly appreciated! 2009/6/5 Cetin Sert cetin.s...@gmail.com module IOStream where import System.IO import System.IO.Unsafe class Out a where

[Haskell-cafe] Concurrent Haskell Actions with Timeout

2009-05-30 Thread Cetin Sert
Hi how could one implement a function in concurrent haskell that either returns 'a' successfully or due timeout 'b'? timed :: Int → IO a → b → IO (Either a b) timed max act def = do Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe

Re: [Haskell-cafe] Concurrent Haskell Actions with Timeout

2009-05-30 Thread Cetin Sert
)' Regards, Cetin Sert 2009/5/30 Sebastian Sylvan sebastian.syl...@gmail.com 2009/5/30 Cetin Sert cetin.s...@gmail.com Hi how could one implement a function in concurrent haskell that either returns 'a' successfully or due timeout 'b'? timed :: Int → IO a → b → IO (Either a b) timed max act

Re: [Haskell-cafe] Concurrent Haskell Actions with Timeout

2009-05-30 Thread Cetin Sert
. On May 30, 2009, at 5:36 PM, Sebastian Sylvan wrote: On Sat, May 30, 2009 at 10:32 PM, Cetin Sert cetin.s...@gmail.com wrote: Thank you for your reply, I'd come up with the following: timed :: Int → IO a → b → IO (Either b a) timed max act def = do r ← new t ← forkIO $ do

[Haskell-cafe] Matrices

2009-04-19 Thread Cetin Sert
specify which one and how ^__^ Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] Re: Haskell Logo Voting has started!

2009-03-19 Thread Cetin Sert
37Lenny222 Just noticed that this logo is way too similar to the logo of Techsmith: http://www.techsmith.com/ Regards, CS 2009/3/19 Eelco Lempsink ee...@lempsink.nl On 19 mrt 2009, at 11:39, Wolfgang Jeltsch wrote: Am Mittwoch, 18. März 2009 13:31 schrieben Sie: On Wed, Mar 18, 2009 at

[Haskell-cafe] Re: Class Instances

2009-02-14 Thread Cetin Sert
type I [b → c] = b type O [b → c] = c re = cycle broadcast :: Pro p ⇒ p → [I p] → [O p] ... Regards, Cetin 2009/2/13 Benedikt Huber benj...@gmx.net Cetin Sert schrieb: Thank you for your answer! This comes close to solving the problem but in the last line of the above I

[Haskell-cafe] Class Instances

2009-02-13 Thread Cetin Sert
Hi, class Processor a where ready :: (forall b c. a → [b → c]) {- instance Processor (b → c) where ready = repeat instance Processor [b → c] where ready = id-} doSth :: (Show p, Processor p) ⇒ p → IO () doSth p = print p --- Why can I not declare the above

[Haskell-cafe] Re: Class Instances

2009-02-13 Thread Cetin Sert
the interface of a little experiment: http://corsis.blogspot.com/ 2009/2/13 Benedikt Huber benj...@gmx.net Cetin Sert schrieb: Hi, class Processor a where ready :: (forall b c. a → [b → c]) instance Processor (b → c) where ready = repeat ... --- Why can

Re: [Haskell-cafe] Re: Computer time, independent of date

2009-01-09 Thread Cetin Sert
Don't know if it might help but: http://en.wikipedia.org/wiki/RDTSC cabal install rdtsc http://hackage.haskell.org/packages/archive/rdtsc/1.1.1/doc/html/System-CPUTime-Rdtsc.html Regards, CS 2009/1/9 Bulat Ziganshin bulat.zigans...@gmail.com Hello Mauricio, Friday, January 9, 2009, 4:01:18

Re: [Haskell-cafe] Re: Computer time, independent of date

2009-01-09 Thread Cetin Sert
Here's a basic draft project for clock_gettime(CLOCK_MONOTONIC, ...) http://sert.homedns.org/hs/mnsec/ http://sert.homedns.org/hs/mnsec/dist/mnsec-1.0.0.tar.gz It could be extended to cover other clock types than just monotonic. Regards, CS 2009/1/9 John Goerzen jgoer...@complete.org Steve

[Haskell-cafe] cabal, multi-file applications

2008-12-23 Thread Cetin Sert
that wlan.hs should be built first than settings.hs than demo3.hs? Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] hackage, gtk2hs

2008-12-23 Thread Cetin Sert
of the need to use the latest gtk2hs they can get from the darcs repos. Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] lengthOP rewrite rules

2008-12-18 Thread Cetin Sert
#-} Best Regards, Cetin Sert 2008/12/18 Luke Palmer lrpal...@gmail.com This does not answer your question, but you can solve this problem without rewrite rules by having length return a lazy natural: data Nat = Zero | Succ Nat And defining lazy comparison operators on it. Of course

Re: [Haskell-cafe] lengthOP rewrite rules

2008-12-18 Thread Cetin Sert
oh, btw I am using GHC 6.10.1 (on Linux x86_64) 2008/12/18 Cetin Sert cetin.s...@gmail.com Hi, I tested the following, why does the rewrite rules not fire when using tuples also in testRewrite2, testRewriteReverse2? compiling: rm *.o; ghc -fglasgow-exts -ddump-simpl-stats -O9 --make

[Haskell-cafe] lengthOP rewrite rules

2008-12-17 Thread Cetin Sert
of `lenEQ' at Possible fix: add (Ord a) to the context of the RULE glenEQ_RHS In the expression: lenEQ xs n When checking the transformation rule glenEQ_RHS 3) What speaks for/against broad usage of such rewrite rules involving list lengths? Best Regards, Cetin Sert

[Haskell-cafe] gtk2hs question - derive SettingsWindow from Window

2008-12-12 Thread Cetin Sert
Hi all, For a network manager of sorts I'm working on, I want to derive a SettingsWindowClass from the WindowClass present in Gtk2Hs: I want (the) instance(s) of the SettingsWindowClass to have a field to store connection settings: 1) Is it safe to do it like this? class WindowClass self ⇒

[Haskell-cafe] wlan library

2008-12-12 Thread Cetin Sert
to access and configure, control WLAN cards? I'd love to hear your comments. Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] type error

2008-12-10 Thread Cetin Sert
Hi, Why does this not function? Prelude sequence [print 'a', print 2] 'a' 2 [(),()] *Prelude let myprint = print* *Prelude sequence [myprint 'a', myprint 2]* interactive:1:18: Couldn't match expected type `()' against inferred type `Char' In the first argument of `myprint', namely 'a'

[Haskell-cafe] ghci start-up banner

2008-11-13 Thread Cetin Sert
Hi all, after reading this announcement on the Galois blog: http://www.galois.com/blog/2008/11/13/tech-talk-mechanically-verified-lisp-interpreters/ I installed Hol4 to play around with it a little bit. I made 2 obvious observations ^_^: 1) It looks like the Hol4 system is just a ML module

[Haskell-cafe] view patterns

2008-11-04 Thread Cetin Sert
let has [] = False; has _ = True -- this one is ok let empty list = case has list of True - False; False - True -- the following is problematic let emp (has - True) = False; emp (has - False) = True interactive:1:4: Warning: Pattern match(es) are overlapped In the definition of

[Haskell-cafe] flipped IO sequence

2008-10-01 Thread Cetin Sert
warn :: String → IO Int warn = return 1 putStrLn-- causes an error -- = \msg → return 1 putStrLn msg -- works just fine -- = \msg → putStrLn msg return 1 -- works just fine () :: Monad m ⇒ m b → m a → m b b a = a = \_ → b Why do I get this compile-time error?? How can one

Re: [Haskell-cafe] cabal upgrade

2008-09-30 Thread Cetin Sert
A reminder: When I wanted to upgrade to yi 0.4.6.2, I needed to download the new package list cabal update #download list of new packages cabal upgrade #make any upgrades Regards, CS 2008/9/26 Duncan Coutts [EMAIL PROTECTED] On Fri, 2008-09-26 at 10:49 +0200, Achim

Re: [Haskell-cafe] Packages

2008-09-30 Thread Cetin Sert
, CS 2008/9/23 Cetin Sert [EMAIL PROTECTED] Does that answer your query? Yep it does, ^__^ Thank you very much. Cetin 2008/9/23 Austin Seipp [EMAIL PROTECTED] Excerpts from Dougal Stanton's message of Tue Sep 23 06:09:58 -0500 2008: That should happen automatically with cabal-install

[Haskell-cafe] Hackage Build Failures

2008-09-30 Thread Cetin Sert
Hi, what is the best action to take if a package from hackage fails to build? Is there a recommended/established common way to deal with build failures/runtime bugs etc.? For example: [EMAIL PROTECTED]:~/Links/Elite/ac cabal install wired Resolving dependencies... Downloading Wired-0.1.1...

Re: [Haskell-cafe] Packages

2008-09-23 Thread Cetin Sert
Austin: Of course, if you are doing haskell development, the best possible way to go (IMO) full-blown cabal install since you will always get the most up-to-date code Let's say I go and compile a library from sources and install it through Cabal. How can I update the binary version of the

Re: [Haskell-cafe] Packages

2008-09-23 Thread Cetin Sert
Does that answer your query? Yep it does, ^__^ Thank you very much. Cetin 2008/9/23 Austin Seipp [EMAIL PROTECTED] Excerpts from Dougal Stanton's message of Tue Sep 23 06:09:58 -0500 2008: That should happen automatically with cabal-install if the version number in the .cabal file has

[Haskell-cafe] ask

2008-09-14 Thread Cetin Sert
Hi why do I get? [EMAIL PROTECTED]:~/lab/exp/1 ./eq 23 23 3 a = b = c = n1-0.8457820374040622n2-0.1542179625959377 when I run import System.IO main :: IO () main = do a ← ask a b ← ask b c ← ask c eval a b c ask v = do putStr (v ++ = ) readLn eval a b c = do case delta 0 of

[Haskell-cafe] random colors, stack space overflow, mersenne and mersenne.pure64

2008-09-12 Thread Cetin Sert
Hi, The following piece of code runs just fine, if I say: instance Random RGB where random = color randomR = colorR instead of: instance Random RGB where random = color2 randomR = colorR When I use random = color2 I encounter a stack space overflow: [EMAIL

Re: [Haskell-cafe] random colors, stack space overflow, mersenne and mersenne.pure64

2008-09-12 Thread Cetin Sert
Oh, hi *^o^* mersenne.pure64 http://sert.homedns.org/lab/colors/var2.hs mersenne http://sert.homedns.org/lab/colors/var.hs the problem seems to be with the definition of colorR in var2.hs CS 2008/9/13 Don Stewart [EMAIL PROTECTED] cetin.sert: random = color2 randomR = colorR

Re: [Haskell-cafe] random colors, stack space overflow, mersenne and mersenne.pure64

2008-09-12 Thread Cetin Sert
Oh, sorry... ^__^ ghc -fglasgow-exts -O2 --make var ghc -fglasgow-exts -O2 --make var2 I've not used pragmas in any source file o_O so far... should go fix that sometime. Thanks for reminding... Using ghc 6.8.3, mersenne-random-0.1.3 and mersenne-random-pure64-0.2.0.2. (Cause I could not find

Re: [Haskell-cafe] random colors, stack space overflow, mersenne and mersenne.pure64

2008-09-12 Thread Cetin Sert
World Haskell to read lots of code, hope it'll help lots of people interested in learning haskell. (Will be released around Christmas here in Germany, I think.) CS 2008/9/13 Don Stewart [EMAIL PROTECTED] bertram.felgenhauer: Cetin Sert wrote: [snip] colorR :: RandomGen g ⇒ (RGB,RGB) → g

Re: [Haskell-cafe] random colors, stack space overflow, mersenne and mersenne.pure64

2008-09-12 Thread Cetin Sert
main :: IO () main = do as - getArgs mt - newPureMT let colors = randomRs (lo,hi) mt :: [RGB] print $ zip tx cs where lo = read $ as !! 0 hi = read $ as !! 1 tx =as !! 2 Why is as not visible in the where block? 2008/9/13 Brandon S. Allbery KF8NH [EMAIL PROTECTED]

[Haskell-cafe] Hackage

2008-06-28 Thread Cetin Sert
Hi, Hackage seems to have been down for a few days now. When is it going to be back online? It is not possible to darcs-get any packages either. Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org

[Haskell-cafe] cgi liftM liftIO

2008-06-13 Thread Cetin Sert
main = runCGI $ handleErrors cgiMain2 Best Regards, Cetin Sert P/s: what are lifts o_O? ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] automatically deriving Map and Filter on datatypes etc.

2008-06-05 Thread Cetin Sert
a = (:↺:) | a :↓: Tab a | Tab a :↙↘: (Tab a,Tab a) deriving (Eq, Show, Read, Map, Filter) If not, do you think it might be nice to have something like this in the future? Best Regards, Cetin Sert ___ Haskell-Cafe

[Haskell-cafe] Haskell Web server

2008-04-25 Thread Cetin Sert
Hi, What is the fastest way to set up a web server that can redirect requests to a haskell application and serve results returned by it? I need to demonstrate a simple visualization tool I have written for analytic tableaux on Monday and need something easy and simple. Best Regards, Cetin Sert

[Haskell-cafe] lookup tables style guidelines

2008-04-23 Thread Cetin Sert
Dear Haskell Devs ^_^, 1) what is the most performant lookup table/hashtable/dictionary solution for Haskell? 1.1) should I use size-balanced binary trees for that or is there a more common way? 2) are there any established style guidelines for haskell code? Best Regards, Cetin Sert

Re: [Haskell-cafe] lookup tables style guidelines

2008-04-23 Thread Cetin Sert
Thanks Don... You are amazing... o_O always so quick with replies... I was using GraphViz to generate some directed graphs*, knowing what to use for a dict/map will help speed things up! Cetin * (for analytic tableaux in Okitsune+) + (need a better name, maybe I should ask Haskell-Cafe for one in

Re: [Haskell-cafe] ghc

2008-04-11 Thread Cetin Sert
moving a binary compiled on a 32-bit machine running Linux to a 64-bit one, would that necessitate recompilation on the target machine or cross-compilation or can 64-bit Linux run 32-bit binaries? 2008/4/11 Jake Mcarthur [EMAIL PROTECTED]: On Apr 10, 2008, at 1:20 PM, Brent Yorgey wrote:

[Haskell-cafe] ghc

2008-04-10 Thread Cetin Sert
haskell here in Heidelberg/Mannheim, Germany. Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] getChar

2008-03-25 Thread Cetin Sert
return (c:cs) I want the input process to terminate when '#' or any other specific key has been pressed. Best Regards, Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] what is the fastest way to extract variables from a proposition?

2008-02-20 Thread Cetin Sert
that 'p' appears twice being irrelevant: -- is there an even faster way to do this? -- -- Cetin Sert -- www.corsis.de ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] what is the fastest way to extract variables from a proposition?

2008-02-20 Thread Cetin Sert
it on another machine though: fetch: svn co https://okitsune.svn.sourceforge.net/svnroot/okitsune . build: ghc -fglasgow-exts -O2 Common.hs Propositions.hs Test.hs testS: time ./a.out sert testH: time ./a.out hutton testB: time ./a.out bromage Best regards, Cetin Sert. On 21/02/2008, [EMAIL PROTECTED

Re: [Haskell-cafe] what is the fastest way to extract variables from a proposition?

2008-02-20 Thread Cetin Sert
of the effect of structures on performance. Thanks for reminding me! Best Regards, Cetin Sert On 21/02/2008, Derek Elkins [EMAIL PROTECTED] wrote: On Thu, 2008-02-21 at 05:10 +0100, Cetin Sert wrote: plong 0 = Var 0 plong n | even n= Or (Var n) (plong (n-1)) | otherwise

Re: [Haskell-cafe] what is the fastest way to extract variables from a proposition?

2008-02-20 Thread Cetin Sert
/Haskell-1/bin$ time ./theResult bromage 101 real0m1.959s user0m1.580s sys 0m0.116s Best Regards, Cetin Sert On 21/02/2008, [EMAIL PROTECTED] [EMAIL PROTECTED] wrote: G'day all. Quoting Cetin Sert [EMAIL PROTECTED]: It is astonishing to see that your version actually performs

[Haskell-cafe] Generic permutations

2008-01-26 Thread Cetin Sert
How can I make a generic permutations function? -- boolean permutations bpms :: Int → [[Bool]] bpms 0 = [[]] bpms n = map (False:) bss ++ map (True:) bss where bss = bpms (n - 1) -- generic permutations pms a :: Int → [[a]] Best Regards, Cetin Sert

[Haskell-cafe] Re: Generic permutations

2008-01-26 Thread Cetin Sert
= pms [False,True] On 26/01/2008, Cetin Sert [EMAIL PROTECTED] wrote: How can I make a generic permutations function? -- boolean permutations bpms :: Int → [[Bool]] bpms 0 = [[]] bpms n = map (False:) bss ++ map (True:) bss where bss = bpms (n - 1) -- generic

Re: [Haskell-cafe] Re: Generic permutations

2008-01-26 Thread Cetin Sert
Thank you very much ^_^. What would be a mathematically correct and understandable name for what we call 'pms' here? And in what module do foldM, combine, replicate, rest, liftM and so on reside? How can I import them? o_O -- Cetin Sert On 26/01/2008, Ryan Ingram [EMAIL PROTECTED] wrote

Re: [Haskell-cafe] Re: Generic permutations with high performance

2008-01-26 Thread Cetin Sert
- 1)) I generalized 'pms' from the 'bools' function on page 108 of Programming in Haskell (Hutton, 2007) -- Cetin Sert On 26/01/2008, Ryan Ingram [EMAIL PROTECTED] wrote: When you say permuations, I think of reorderings of a list, for example: permutations [1,2,3] = [ [1,2,3], [1,3,2

Re: [Haskell-cafe] Re: Generic permutations

2008-01-26 Thread Cetin Sert
- 1)) I generalized 'pms' from the 'bools' function on page 108 of Programming in Haskell (Hutton, 2007) -- Cetin Sert On 26/01/2008, Cetin Sert [EMAIL PROTECTED] wrote: Thank you very much ^_^. What would be a mathematically correct and understandable name for what we call 'pms' here

Re: [Haskell-cafe] Re: Generic permutations

2008-01-26 Thread Cetin Sert
Thanks Jed, replicateM is almost as performant as pms on my pc (+ 2~ seconds). That's a killer suggestion... thank you very much ^_^ --Cetin Sert On 27/01/2008, Jed Brown [EMAIL PROTECTED] wrote: The problem you solved can be solved much more elegantly: pms : [a] - Int - [[a]] pms xs

[Haskell-cafe] Yi and Data.ByteString

2008-01-21 Thread Cetin Sert
representation in GHC? I study computational linguistics and plan to switch to Haskell in the near future, that is once I get to grips with the language and the whole new thought model one has to develop as an imperative programmer. Best Regards, Cetin Sert www.corsis.de

Re: [Haskell-cafe] Yi and Data.ByteString

2008-01-21 Thread Cetin Sert
/2008, pierre [EMAIL PROTECTED] wrote: Hello, On Mon, Jan 21, 2008 at 07:12:26PM +0100, Cetin Sert wrote: 2) When if ever is Data.ByteString going to be the default string representation in GHC? Why would you need such a thing? ByteStrings don't have any unicode support, and they can

[Haskell-cafe] non-alphabetical mathematical symbols as non-infix function names

2008-01-21 Thread Cetin Sert
) is it not possible to define a (non-infix) function whose name consists of a single non-alphabetical mathematical symbol? ¬ :: Bool → Bool -- parser error on input ** ¬ q = not q -- parser error on input ** Cetin Sert ___ Haskell-Cafe mailing list Haskell-Cafe

[Haskell-cafe] Reflection.Emit in Haskell

2008-01-17 Thread Cetin Sert
the same in Haskell. Book or online article references specific to this issue will be highly appreciated ^_^ Best Regards, Cetin Sert INF 521, 4-6-2 69120 Heidelberg Germany http://www.corsis.de ___ Haskell-Cafe mailing list Haskell-Cafe

[Haskell-cafe] Problems with Unicode Symbols as Infix Function Names in Propositional Calculus Haskell DSL

2008-01-09 Thread Cetin Sert
parse my source files correctly? If it is not possible yet, please consider this as a “feature request”. Best Regards, Cetin Sert INF 521, 4-6-2 69120 Heidelberg Germany http://www.corsis.de ___ Haskell-Cafe mailing list Haskell-Cafe

RE: [Haskell-cafe] Problems with Unicode Symbols as Infix Function Names in Propositional Calculus Haskell DSL

2008-01-09 Thread Cetin Sert
\Sert\Lab\Haskell\HaskellApp1\HaskellApp1\src\Explogic.hs Line 25 Column 2 in the IDE. Maybe this is Visual Haskell-specific o_O!? -- not (¬) :: P a = a - Bool (¬) a | g a = False | otherwise = True Best Regards, Cetin Sert -Original Message- From: Don Stewart

RE: [Haskell-cafe] Problems with Unicode Symbols as Infix Function Names in Propositional Calculus Haskell DSL

2008-01-09 Thread Cetin Sert
that are accessible or inferred type infos etc..) might be causing a miscommunication with regards to the file encodings. I also tried writing -XUnicodeSyntax. I'll try to use some other editor and directly call the compiler to see if it works. Thanks for all your support ^_^ Best Regards, Cetin Sert http

[Haskell-cafe] Type Mismatch

2008-01-07 Thread Cetin Sert
of `to': to = toStream C:\Users\Sert\Lab\Haskell\HaskellApp1\HaskellApp1\src\Main.hs 64 8 How can I make the types match so that I can declare lists streamable? Is there something like in-place type annotations as in ML/OCaml/F#? Best Regards, Cetin Sert corsis.de/blog