[Haskell-cafe] Re: Ready for testing: Unicode support for Handle I/O

2009-02-04 Thread Max Vasin
. -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: Timing difference

2008-12-25 Thread Max Vasin
will use a compiled version instead of interpreted). -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: hGetContents and lazyness

2008-09-23 Thread Max Vasin
Micah Cowan [EMAIL PROTECTED] writes: Max Vasin wrote: Hello, haskellers! Suppose we have function (it filters package filenames from apt Packages file): getPackageList :: FilePath - IO [FilePath] getPackageList packageFile = withFile packageFile ReadMode

[Haskell-cafe] hGetContents and lazyness

2008-09-22 Thread Max Vasin
it to return $! map (drop 10) $ filter (startsWith Filename:) $ lines c makes getPackageList function return several (but not all) filenames. What I'm missing? And how can I fix my code? -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe

Re: [Haskell-cafe] FW: Treating command-line arguments as a Haskell expression

2007-12-24 Thread Max Vasin
2007/12/24, Simon Peyton-Jones [EMAIL PROTECTED]: Would someone familiar with the command-line-parsing libraries care to help Krassimir? AFAIU Krassimir's needs, hs-plugins will help him (function eval). -- WBR, Max Vasin JID: [EMAIL PROTECTED

Re: [Haskell-cafe] Template Haskell newbie questions

2007-09-24 Thread Max Vasin
(a, b) - c. -- WBR, Max Vasin JID: [EMAIL PROTECTED] ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] ANNOUNCE: xmonad 0.3

2007-09-06 Thread Max Vasin
. In Windows there is no such thing as window manager (it's functionality is built-in into Windows itself). -- WBR, Max Vasin JID: [EMAIL PROTECTED] ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: [Haskell-cafe] ANNOUNCE: xmonad 0.3

2007-09-05 Thread Max Vasin
, would it be possible to integrate this into GTK2HS so it works as a docking manager inside an application? First of all, gtk is a cross platform toolkit and gtk2hs is just a wrapper. It will be better to implement a docking manager in C to let whole gtk community use it. -- WBR, Max Vasin JID

Re: [Haskell-cafe] defining mapPairs function

2007-08-29 Thread Max Vasin
) = ... - left as an exercise, but no need for head or tail. And you can get less equations if you replace first two equations with mapPairs f x = x and place it after Neil's. -- WBR, Max Vasin JID: [EMAIL PROTECTED] ___ Haskell-Cafe mailing list

[Haskell-cafe] Re: ANN: HSH 1.2.0

2007-03-21 Thread Max Vasin
Setup.lhs configure $ runhaskell Setup.lhs build $ sudo runhaskell Setup.lhs install Another way is to take ghc6 and all haskell libs from fiesty. -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman

[Haskell-cafe] Re: How to use infinite lists to define the list of all negative integers

2007-02-05 Thread Max Vasin
Bahtijar == Bahtijar Vogel [EMAIL PROTECTED] writes: Bahtijar Hi, How am I supposed to use infinite lists to define Bahtijar the list of all negative integers? negs = [-1,-2..] -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe

[Haskell-cafe] Re: nested maybes

2007-02-04 Thread Max Vasin
= False import isJust boolFromMaybe = isJust -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: snd and tuples of various sizes...

2007-02-02 Thread Max Vasin
, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Default (or empty) values

2007-01-17 Thread Max Vasin
, drift). What would you recommend using in this case? Or may be it would be better to drop out Empty and use something else? TIA -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell-cafe] Re: Default (or empty) values

2007-01-17 Thread Max Vasin
Pedro == Pedro Baltazar Vasconcelos [EMAIL PROTECTED] writes: Pedro On Wed, 17 Jan 2007 15:58:04 +0300 Pedro Max Vasin [EMAIL PROTECTED] wrote: Hello all! Let data Book = Book { authors :: [String], title :: String, editor :: Maybe String, edition :: Maybe String, volume :: Maybe

[Haskell-cafe] Re: Default (or empty) values

2007-01-17 Thread Max Vasin
Colin == Colin DeVilbiss [EMAIL PROTECTED] writes: Colin On 1/17/07, Max Vasin [EMAIL PROTECTED] wrote: Fields of the Book datatype which are not (Maybe a) are required to be present. Colin This doesn't actually answer your question, but if those Colin fields are really required and you want

[Haskell-cafe] Re: Default (or empty) values

2007-01-17 Thread Max Vasin
Henning == Henning Thielemann [EMAIL PROTECTED] writes: Henning On Wed, 17 Jan 2007, Max Vasin wrote: Hello all! Let data Book = Book { authors :: [String], title :: String, editor :: Maybe String, edition :: Maybe String, volume :: Maybe (Int, Int), -- e.g. volume 1 of 3

[Haskell-cafe] Re: Default (or empty) values

2007-01-17 Thread Max Vasin
Pedro == Pedro Baltazar Vasconcelos [EMAIL PROTECTED] writes: Pedro On Wed, 17 Jan 2007 16:57:54 +0300 Pedro Max Vasin [EMAIL PROTECTED] wrote: It does not enforce presence of required fields at type level. Also it does not enforce that fields pages and year are Int. And I want to move

[Haskell-cafe] Re: The Future of MissingH

2006-11-27 Thread Max Vasin
other reasons why the executable file might be covered by the GNU General Public License. -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: The Future of MissingH

2006-11-26 Thread Max Vasin
. It is incompatible with Benjamin proprietary software. There's a difference. A small addition: some GPLed libraries (libstdc++ AFAIK) allow linking with proprietary software by adding clause to lisence which relaxes GPL requirements. -- WBR, Max Vasin. ___ Haskell

[Haskell-cafe] Re: best Linux for GHC?

2006-11-13 Thread Max Vasin
for Linux. PS: I'm using Debian testing/unstable. -- WBR, Max Vasin ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: what GUI library should i select?

2006-11-13 Thread Max Vasin
On linux you should use your package manager (whenever possible), not binaries from the site (or compile it yourself). -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: StateT and modify

2006-11-08 Thread Max Vasin
will Peter scale to more elaborate logging mechanisms later on... If all you want from IO is logging why not just use MonadWriter? -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell

[Haskell-cafe] Re: More documentation: languages written in Haskell

2006-10-29 Thread Max Vasin
themselves ... ;) please add it to the Donald list. I have no login at haskell.org, so I post here. There is a Curry compiler implemented in Haskell: The Münster Curry Compiler (http://danae.uni-muenster.de/~lux/curry/). -- WBR, Max Vasin. ___ Haskell-Cafe

[Haskell-cafe] Re: UTF and Parsec

2006-10-27 Thread Max Vasin
John that parsec is picking up  at the beginning of the All strings in Haskell are unicode - you only have to input them correctly :-) I've used Streams (somewhere at haskell.org) library to read files in UTF-8 and then parsed read data with Parsec. -- WBR, Max Vasin

[Haskell-cafe] Re: Haskell compiler from a USB Stick?

2006-10-03 Thread Max Vasin
switched keyboard layout to russian :-) -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

Re: Map.genericSize

2006-10-02 Thread Max Vasin
library which allows to old more data but has the same Bulat interface as Data.Map It's a job for a collections framework, isn't it? -- WBR, Max Vasin. ___ Glasgow-haskell-users mailing list Glasgow-haskell-users@haskell.org http://www.haskell.org

[Haskell-cafe] Re: Getting the latest

2006-09-27 Thread Max Vasin
). -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: Is Haskell a 5GL?

2006-09-25 Thread Max Vasin
of the program as a set of equations (as opposed to let). -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: Is Haskell a 5GL?

2006-09-25 Thread Max Vasin
can write algorithms in Haskell (3GL), embed a DSL in it and write a program in that DSL or in several DSLs (4GL). AFAIK Mathematica is not a logic programming language, thus all its features can be implemented in Haskell as library, will be Haskell a 5GL in this case? -- WBR, Max Vasin

[Haskell-cafe] Re: Defining show for a function type.

2006-07-11 Thread Max Vasin
_) = Func! main = do putStrLn $ show Bar putStrLn $ show $ Foo (+) -- WBR, Max Vasin. NP: Nothing playing right now ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: Using of C constants in Haskell sources; Determining compilation environment (Unix vs Windows)

2006-07-11 Thread Max Vasin
to generate Haskell code (yeh, I know it's silly, but why not?). -- WBR, Max Vasin. NP: Nothing playing right now ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: how to apply a function which returns IO() to a list?

2006-06-14 Thread Max Vasin
functions in haskell is developer allways the same, the most primitive one and i think i cant developer use it here. developer writeList [] = ??? developer writeList (x:xs) = (writeHtml x) ??? writeList [] = return () writeList (x:xs) = do writeHtml x writeList xs -- WBR, Max

[Haskell-cafe] Re: calling haskell from C++

2006-05-23 Thread Max Vasin
. There is also an FFI which allows you to call functions written in Haskell from other languages. In this case your Haskell program must export C-level API to be used from C++. Or, and of cause you can use IPC to connect your programs. -- WBR, Max Vasin. NP

[Haskell-cafe] Re: develop new Haskell shell?

2006-05-12 Thread Max Vasin
allow all the Brian control flow/ ease of use issues to be explored just using GHCi Brian / Hugs etc before tackling the problem of how to get binaries Brian to interface with the shell. -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe

[Haskell] Re: lhs2TeX-friendly emacs mode?

2006-04-17 Thread Max Vasin
@) as Haskell Conal rather than LaTeX code. May be mmm-mode will help you, I haven't tried the combination mmm-mode+latex-mode+haskell-mode. AFAIU it should work (I used mmm-mode with cweb mode to highlight latex and c code simultaneously). -- WBR, Max Vasin

[Haskell] Re: lhs2TeX-friendly emacs mode?

2006-04-17 Thread Max Vasin
have to select submode class (C-c % C-c). I used CWEB submode class which shipped with mmm-mode. Defining new submode is pretty easy - look at the documentation which comes with mmm-mode and examples (on my machine they are in /usr/share/emacs/site-lisp/mmm-mode/). -- WBR, Max Vasin

Re: Dumb guy needs help

2006-04-03 Thread Max Vasin
consists of 2 subexpressions: ((3*4) + (2*(12^2))) and 2 connected by the `-' operator, so ex1 = Sub ex1_2 2 where ex1_2 is an Exp representing ((3*4) + (2*(12^2))) which is a sum (Plus .). -- WBR, Max Vasin. ___ Glasgow-haskell-users mailing list

[Haskell-cafe] Type classes

2006-03-20 Thread Max Vasin
(Entry e) = formatEntry e How can I define compareEntries for this instance? -- WBR, Max Vasin. ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.org http://www.haskell.org/mailman/listinfo/haskell-cafe

[Haskell-cafe] Re: Type classes

2006-03-20 Thread Max Vasin
:: e - String formatEntry :: e - String compareEntries :: e - e - Ordering data Entry a = Entry a No. I don't want that. The database parsing function returns Map.Map String Entry but entries can of different types (and these type vary over styles). -- WBR, Max Vasin

[Haskell-cafe] Re: Type classes

2006-03-20 Thread Max Vasin
. Converting entries from data BibEntry = { beLabel :: String , beKind :: String , beProperties :: Map.Map String String } is some sort of static type checking of the database. -- WBR, Max Vasin. ___ Haskell

[Haskell-cafe] Re: Proper way to write this

2005-12-27 Thread Max Vasin
:: DaytimeServer - IO DaytimeServer runDaytimeServer dts = do dts' - runStreamDaytimeServer dts dts' - runDgramDaytimeServer dts' return dts' runDaytimeServer dts = runStreamDaytimeServer dts = runDgramDaytimeServer Don't write a - foo return a write foo instead. -- WBR, Max Vasin