Re: [Haskell-cafe] a library for abstract algebra?

2013-04-19 Thread Mikhail Glushenkov
Hi, Petr Pudlák gmail.com> writes: > > Hi, > is there a Haskell library for defining and working with algebraic structures [...] ? There is also http://hackage.haskell.org/package/HaskellForMaths ___ Haskell-Cafe mailing list Haskell-Cafe@haskell.

[Haskell-cafe] Re: Converting -fglasgow-exts into LANGUAGE pragmas

2009-03-31 Thread Mikhail Glushenkov
Hi, Martijn van Steenbergen van.steenbergen.nl> writes: > > Hello café, > > I want to replace the -fglasgow-exts in the snippet below by LANGUAGE > pragmas. Rank2Types alone doesn't suffice. Which do I need to get the > snippet to compile? Works for me with {-# LANGUAGE Rank2Types, Impredi

[Haskell-cafe] Declaring each instance of a typeclass to be also an instance of another typeclass

2009-01-11 Thread Mikhail Glushenkov
Hi, Is it possible to write something like this: > {-# LANGUAGE FlexibleInstances, UndecidableInstances #-} > > import Control.Monad (liftM) > > instance (Monad a) => Functor a where > fmap = liftM without having to use UndecidableInstances (and preferably, other type system extensions too)?

[Haskell-cafe] Re: Haskell Platform 2009.2.0.1 and GLUT32.DLL on Windows: which version?

2009-07-06 Thread Mikhail Glushenkov
Hi Peter, Peter Verswyvelen gmail.com> writes: > I know GLUT32.DLL is not bundled with the Haskell Platform > installer, but which GLUT32.DLL should I use? I compiled a basic example [1] successfully using the DLL downloaded from [2]. But since that's the first hit in Google, you've probably a

[Haskell-cafe] Re: Haskell Platform - changing the global install dir

2009-10-05 Thread Mikhail Glushenkov
Hi Paul, Paul Moore gmail.com> writes: > Is there a way I could have specified that I want the global install > directory in D:\Apps\Haskell? I guess I could hack my cabal\config > file (and presumably change PATH) but that seems a bit ugly. A bit ugly? Why? That's precisely what the config fi

Re: [Haskell-cafe] Re: Haskell Platform - changing the global install dir

2009-10-06 Thread Mikhail Glushenkov
Hi Paul, On Tue, Oct 6, 2009 at 9:11 AM, Paul Moore > The "ugliness" (a bad word, I agree) was the need to change multiple > items - (at least) 2 places in the config file and (presumably) the > PATH entry. > > Is that all I need to change? I'm not a Cabal expert, but it looks like you could jus

[Haskell-cafe] Re: regex-compat on latest Haskell Platform

2010-08-17 Thread Mikhail Glushenkov
Hi Kevin, Kevin Jardine gmail.com> writes: > > I'm running Haskel Platform 2010.2.0.0 and attempting to compile with > regex-compat under Windows XP. > [...] Apparently, you've been bitten by a bug in the installer: http://trac.haskell.org/haskell-platform/ticket/137 I haven't updated the in

[Haskell-cafe] Re: Haskell Platform on Windows - cabal update problems.

2010-09-04 Thread Mikhail Glushenkov
Hi, Serguey Zefirov gmail.com> writes: > > I've installed recent Haskell Platform and tried to wrap my head > around cabal to finally figure out how to use it. > > [...] > > Now it gives me even more interesting error: "cabal.EXE: fromFlag > NoFlag. Use fromFlagOrDefault" > > Googling doesn'

[Haskell-cafe] Re: New .hs File Icons

2010-09-04 Thread Mikhail Glushenkov
Christian Eltges googlemail.com> writes: > > Hello, > > I was wondering why the File-Icon installed by GHC with the lambda for > .hs files hasn't changed to the new > > [...] > > So if the only reason for using the old icon was, that there is no new > one, then you can use this. Cool, thanks!

[Haskell-cafe] Re: Building regex-posix for windows

2010-04-15 Thread Mikhail Glushenkov
Hi, Станислав Черничкин gmail.com> writes: > > > I'm having > trouble building regex-posix for Windows [...] See this thread: http://thread.gmane.org/gmane.comp.lang.haskell.libraries/12721 Basically, you need to checkout the darcs version which includes C sources for libregex and hack the .

[Haskell-cafe] Safe Haskell and instance coherence

2012-10-08 Thread Mikhail Glushenkov
Hello, It's a relatively well-known fact that GHC allows for multiple type class instances for the same type to coexist in a single program. This can be used, for example, to construct values of the type Data.Set.Set that violate the data structure invariant. I was mildly surprised to find out tha

Re: [Haskell-cafe] Safe Haskell and instance coherence

2012-10-11 Thread Mikhail Glushenkov
Hello Simon, On Thu, Oct 11, 2012 at 11:24 AM, Simon Marlow wrote: > On 08/10/2012 20:11, Mikhail Glushenkov wrote: >> I couldn't find anything on the interplay between orphan instances and >> Safe Haskell both in the Haskell'12 paper and online. Is this >> som

Re: [Haskell-cafe] Safe Haskell and instance coherence

2012-10-11 Thread Mikhail Glushenkov
Hello, On Thu, Oct 11, 2012 at 3:54 PM, MigMit wrote: > You have a bigger problem coming. Some extensions make multiple instances OK, > even in Safe Haskell. For example: > > {-# LANGUAGE FlexibleInstances, IncoherentInstances, Safe #-} > [...] Safe Haskell already disallows OverlappingInstance

Re: [Haskell-cafe] Safe Haskell and instance coherence

2012-10-11 Thread Mikhail Glushenkov
Hello, On Thu, Oct 11, 2012 at 4:33 PM, MigMit wrote: > > On Oct 11, 2012, at 6:23 PM, Mikhail Glushenkov > wrote: >> >> On Thu, Oct 11, 2012 at 3:54 PM, MigMit wrote: >>> You have a bigger problem coming. Some extensions make multiple instances >>>

Re: [Haskell-cafe] Safe Haskell and instance coherence

2012-10-17 Thread Mikhail Glushenkov
Hello David, On Wed, Oct 17, 2012 at 6:02 PM, David Mazieres expires 2013-01-15 PST wrote: > Can you elaborate on how this can be used to break the data structure > invariant? If in safe Haskell you import two modules that have > overlapping instances, you will not be able to use the two instanc

Re: [Haskell-cafe] Safe Haskell and instance coherence

2012-10-17 Thread Mikhail Glushenkov
Hello David, On Thu, Oct 18, 2012 at 6:21 AM, David Mazieres expires 2013-01-15 PST wrote: > > What's interesting is that these examples doesn't violate the goals of > Safe Haskell--i.e., they don't violate type safety, encapsulation, or > semantic consistency as we defined it--but they are worri

Re: [Haskell-cafe] How to make ghc 7 with llvm?

2011-04-29 Thread Mikhail Glushenkov
Hi, Henning Thielemann henning-thielemann.de> writes: > > Nontheless it might be interesting to let GHC emit LLVM bitcode. As far as > I understand, this would enable LLVM's Link Time Optimizations. You can already emit .ll code with -ddump-llvm. All LLVM tools that take .bc files as input (ll

Re: [Haskell-cafe] How to make ghc 7 with llvm?

2011-04-29 Thread Mikhail Glushenkov
Henning Thielemann henning-thielemann.de> writes: > > Nontheless it might be interesting to let GHC emit LLVM bitcode. As far as > I understand, this would enable LLVM's Link Time Optimizations. And if you really need .bc, there is always llvm-as.

Re: [Haskell-cafe] Level of Win32 GUI support in the Haskell platform

2011-12-29 Thread Mikhail Glushenkov
Hi, Steve Horne blueyonder.co.uk> writes: > > I've been for functions like GetMessage, TranslateMessage and > DispatchMessage in the Haskell Platform Win32 library - the usual > message loop stuff - and not finding them. Hoogle says "no results found". Haskell Platform includes the Win32 pac