Re: [Haskell-cafe] Alternative name for return

2013-08-15 Thread Erik Hesselink
On Thu, Aug 15, 2013 at 5:39 AM, Jason Dagit dag...@gmail.com wrote:
 Also, if anyone wants to look at prior art first, Idris supports applicative
 brackets.

As does she [0].

Erik

[0] https://personal.cis.strath.ac.uk/conor.mcbride/pub/she/idiom.html

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] llvm on macos

2013-08-15 Thread Anton Nikishaev
Ozgur Akgun ozgurak...@gmail.com writes:

 Hi.

 On 10 August 2013 18:20, Brandon Allbery allber...@gmail.com wrote:

 There may be some support for requesting specific versions from
 Homebrew.


 Try `brew versions llvm`. Then, you'll need to run the git checkout
 command in `brew --prefix` directory.


Or brew tap homebrew/versions and then install llvm31 or whatever


-- 
lelf


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Alternative name for return

2013-08-15 Thread Dag Odenhall
I particularly like she's (her?) syntax for Alternative. Not sure whether
or not Idris has that. Applicative tuples would be nice too, something like
(|a,b,c|) translating to liftA3 (,,) a b c. And operators too, liftA2 (+) a
b as (| a + b |)?


On Thu, Aug 15, 2013 at 11:08 AM, Erik Hesselink hessel...@gmail.comwrote:

 On Thu, Aug 15, 2013 at 5:39 AM, Jason Dagit dag...@gmail.com wrote:
  Also, if anyone wants to look at prior art first, Idris supports
 applicative
  brackets.

 As does she [0].

 Erik

 [0] https://personal.cis.strath.ac.uk/conor.mcbride/pub/she/idiom.html

 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Alternative name for return

2013-08-15 Thread Anton Nikishaev
Simon Peyton-Jones simo...@microsoft.com writes:

 |  Indeed, I wished the 0-ary case would be more alike to the unary
 |  and binary case, cf.
 |  
 | return f0
 | f1 $ a1
 | f2 $ a1 * a2
 |  
 |  What is needed is a nice syntax for idiom brackets.

 Indeed.  I'm quite open to adding idiom brackets to GHC, if everyone
 can agree on their syntax, and someone would like to offer a patch.

 Something like
   (| f a1 a2 |)
 perhaps?

I can make a patch after people agree on everything.

There's also http://hackage.haskell.org/package/applicative-quoters with
its template haskell nastiness

h :m +Control.Applicative.QQ.Idiom
h :set -XQuasiQuotes
h [i| (,) THX BYE |]
[('T','B'),('T','Y'),('T','E'),('H','B'),('H','Y'),('H','E'),('X','B'),('X','Y'),('X','E')]



-- 
lelf


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Alternative name for return

2013-08-15 Thread Tikhon Jelvis
If we're adding applicative brackets, it would be nice to have something
like ⦇⦈ as options via UnicodeSyntax. When playing around with She, I found
it much easier to read than the ASCII version, especially when I needed to
combine them:

(|(|a + b|) + (|c * d|)|)
⦇⦇a + b⦈ + ⦇c * d⦈⦈

Coincidentally, She is the perfect way to experiment with idiom brackets
while thinking about a patch like this. I found it very illustrative just
to go through old code and see what could really be improved and what
couldn't. For me personally, I certainly found *some* code became more
readable, but not quite as much as I expected.


On Thu, Aug 15, 2013 at 10:44 AM, Anton Nikishaev m...@lelf.lu wrote:

 Simon Peyton-Jones simo...@microsoft.com writes:

  |  Indeed, I wished the 0-ary case would be more alike to the unary
  |  and binary case, cf.
  |
  | return f0
  | f1 $ a1
  | f2 $ a1 * a2
  |
  |  What is needed is a nice syntax for idiom brackets.
 
  Indeed.  I'm quite open to adding idiom brackets to GHC, if everyone
  can agree on their syntax, and someone would like to offer a patch.
 
  Something like
(| f a1 a2 |)
  perhaps?

 I can make a patch after people agree on everything.

 There's also http://hackage.haskell.org/package/applicative-quoters with
 its template haskell nastiness

 h :m +Control.Applicative.QQ.Idiom
 h :set -XQuasiQuotes
 h [i| (,) THX BYE |]

 [('T','B'),('T','Y'),('T','E'),('H','B'),('H','Y'),('H','E'),('X','B'),('X','Y'),('X','E')]



 --
 lelf


 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] ANN: Rlang-QQ-0.0.0.0

2013-08-15 Thread adam vogt
Hello Cafe,

I am pleased to announce the first release of Rlang-QQ. You can find
it at http://hackage.haskell.org/package/Rlang-QQ-0.0.0.0.

The package provides a quasiquoter which makes it easier to call R
(http://www.r-project.org/) using values calculated with GHC.
Variables in quasiquoter prefixed with hs_ lead to the corresponding
haskell variable being made available to R (provided there is an
instance to marshal values of that type). In other words, `hs_foo' in
the quasiquote will start off as whatever `foo' is on the haskell
side. For now no attempt is made to translate anything on the R side
back to haskell.

Regards,
Adam Vogt

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Haddock multiple definitions

2013-08-15 Thread jabolopes
Hi,

I am using

  GHC: 6.12.1
  Haddock: 2.6.0

and the following does not work with Haddock (GHC is fine!):

  -- Main

  -- | Blah blah blah
  (x, y, z) = (1, 2, 3)

$ haddock ...
/tmp/Main.hs:2:0: parse error on input `('


Is this a bug? Or it's just not part of Haddock?


This seems like an interesting feature to document several definitions
together, for example, error codes:

-- | Syscall error codes for blah...
--
-- errA when blah
-- ...
(errA, errB, errC) = ...

Cheers,
Jose

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] llvm on macos

2013-08-15 Thread Carter Schonwald
Just brew install llvm should work fine.

The version warning is just the ghc devs beig conservative about what they
are committing to supporting given finite resources and llvm changing over
time.

On Thursday, August 15, 2013, Anton Nikishaev wrote:

 Ozgur Akgun ozgurak...@gmail.com javascript:; writes:

  Hi.
 
  On 10 August 2013 18:20, Brandon Allbery allber...@gmail.comjavascript:;
 wrote:
 
  There may be some support for requesting specific versions from
  Homebrew.
 
 
  Try `brew versions llvm`. Then, you'll need to run the git checkout
  command in `brew --prefix` directory.
 

 Or brew tap homebrew/versions and then install llvm31 or whatever


 --
 lelf


 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org javascript:;
 http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] llvm on macos

2013-08-15 Thread Ozgur Akgun
Hi.

On 15 August 2013 20:35, Carter Schonwald carter.schonw...@gmail.comwrote:

 Just brew install llvm should work fine.


I wonder what makes you think this is the case.

At this moment in time, `brew install llvm` will install llvm-3.3.
Using llvm-3.3, I get warnings and errors. Using llvm-3.2, I get warnings
but I never got any errors. This is not to say that they cannot happen on
other packages.

I've just uninstalled 3.2, installed 3.3, and tried to compile a project of
mine. One of its dependencies, data-default-class, failed to compile.
The following is what happened on my computer.

Hope this helps,
Ozgur.


$ ghc --version
The Glorious Glasgow Haskell Compilation System, version 7.6.3
$ cabal --version
cabal-install version 1.16.0.2
using version 1.16.0 of the Cabal library
$ cabal install --force-reinstalls --disable-documentation
--disable-library-profiling --disable-executable-profiling
 --ghc-options=-fllvm data-default-class
Resolving dependencies...
Configuring data-default-class-0.0.1...
Building data-default-class-0.0.1...
Preprocessing library data-default-class-0.0.1...
[1 of 1] Compiling Data.Default.Class ( Data/Default/Class.hs,
dist/build/Data/Default/Class.o )
You are using a new version of LLVM that hasn't been tested yet!
We will try though...
wrong initalizer for intrinsic global variable
[0 x i8*] undef
Broken module found, compilation aborted!
0  libLLVM-3.3.dylib 0x00010223faee
llvm::sys::PrintStackTrace(__sFILE*) + 40
1  libLLVM-3.3.dylib 0x00010223fef5 SignalHandler(int) + 241
2  libsystem_c.dylib 0x7fff8601f94a _sigtramp + 26
3  libsystem_c.dylib 0x000102a10a00 _sigtramp + 2090799312
4  libLLVM-3.3.dylib 0x00010223fd6d abort + 22
5  libLLVM-3.3.dylib 0x000101f08466 (anonymous
namespace)::Verifier::abortIfBroken() + 236
6  libLLVM-3.3.dylib 0x000101f07b97 (anonymous
namespace)::Verifier::doFinalization(llvm::Module) + 3477
7  libLLVM-3.3.dylib 0x000101ef63a4
llvm::FPPassManager::doFinalization(llvm::Module) + 56
8  libLLVM-3.3.dylib 0x000101ef5e52
llvm::FunctionPassManagerImpl::doFinalization(llvm::Module) + 62
9  libLLVM-3.3.dylib 0x000101ef5d43
llvm::FunctionPassManager::doFinalization() + 21
10 opt   0x000101be19aa
std::vectorstd::pairllvm::BasicBlock*,
llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock ,
std::allocatorstd::pairllvm::BasicBlock*,
llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock  
::_M_insert_aux(__gnu_cxx::__normal_iteratorstd::pairllvm::BasicBlock*,
llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock *,
std::vectorstd::pairllvm::BasicBlock*,
llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock ,
std::allocatorstd::pairllvm::BasicBlock*,
llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock,
std::pairllvm::BasicBlock*, llvm::SuccIteratorllvm::TerminatorInst*,
llvm::BasicBlock  const) + 6988
11 libdyld.dylib 0x7fff8959c7e1 start + 0
12 libdyld.dylib 0x0006 start + 1990604837
Stack dump:
0. Program arguments: opt
/var/folders/h5/3mmbxydn5qs3w9f3j6mgmhscgn/T/ghc11789_0/ghc11789_0.ll
-o
/var/folders/h5/3mmbxydn5qs3w9f3j6mgmhscgn/T/ghc11789_0/ghc11789_0.bc
-O1 --enable-tbaa=true
llc:
/var/folders/h5/3mmbxydn5qs3w9f3j6mgmhscgn/T/ghc11789_0/ghc11789_0.bc:
error: Could not open input file: No such file or directory
Failed to install data-default-class-0.0.1
cabal: Error: some packages failed to install:
data-default-class-0.0.1 failed during the building phase. The exception
was:
ExitFailure 1
___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] llvm on macos

2013-08-15 Thread Carter Schonwald
Huh.  I thought the 3.3 llvm problems only happened when building ghc.
 Oops.  Your absolutely right.  Ghc  7.7 does not generate in general, IR
that llvm = 3.3 will be happy with.

On Thursday, August 15, 2013, Ozgur Akgun wrote:

 Hi.

 On 15 August 2013 20:35, Carter Schonwald 
 carter.schonw...@gmail.comjavascript:_e({}, 'cvml', 
 'carter.schonw...@gmail.com');
  wrote:

 Just brew install llvm should work fine.


 I wonder what makes you think this is the case.

 At this moment in time, `brew install llvm` will install llvm-3.3.
 Using llvm-3.3, I get warnings and errors. Using llvm-3.2, I get warnings
 but I never got any errors. This is not to say that they cannot happen on
 other packages.

 I've just uninstalled 3.2, installed 3.3, and tried to compile a project
 of mine. One of its dependencies, data-default-class, failed to compile.
 The following is what happened on my computer.

 Hope this helps,
 Ozgur.


 $ ghc --version
 The Glorious Glasgow Haskell Compilation System, version 7.6.3
 $ cabal --version
 cabal-install version 1.16.0.2
 using version 1.16.0 of the Cabal library
 $ cabal install --force-reinstalls --disable-documentation
 --disable-library-profiling --disable-executable-profiling
  --ghc-options=-fllvm data-default-class
 Resolving dependencies...
 Configuring data-default-class-0.0.1...
 Building data-default-class-0.0.1...
 Preprocessing library data-default-class-0.0.1...
 [1 of 1] Compiling Data.Default.Class ( Data/Default/Class.hs,
 dist/build/Data/Default/Class.o )
 You are using a new version of LLVM that hasn't been tested yet!
 We will try though...
 wrong initalizer for intrinsic global variable
 [0 x i8*] undef
 Broken module found, compilation aborted!
 0  libLLVM-3.3.dylib 0x00010223faee
 llvm::sys::PrintStackTrace(__sFILE*) + 40
 1  libLLVM-3.3.dylib 0x00010223fef5 SignalHandler(int) + 241
 2  libsystem_c.dylib 0x7fff8601f94a _sigtramp + 26
 3  libsystem_c.dylib 0x000102a10a00 _sigtramp + 2090799312
 4  libLLVM-3.3.dylib 0x00010223fd6d abort + 22
 5  libLLVM-3.3.dylib 0x000101f08466 (anonymous
 namespace)::Verifier::abortIfBroken() + 236
 6  libLLVM-3.3.dylib 0x000101f07b97 (anonymous
 namespace)::Verifier::doFinalization(llvm::Module) + 3477
 7  libLLVM-3.3.dylib 0x000101ef63a4
 llvm::FPPassManager::doFinalization(llvm::Module) + 56
 8  libLLVM-3.3.dylib 0x000101ef5e52
 llvm::FunctionPassManagerImpl::doFinalization(llvm::Module) + 62
 9  libLLVM-3.3.dylib 0x000101ef5d43
 llvm::FunctionPassManager::doFinalization() + 21
 10 opt   0x000101be19aa
 std::vectorstd::pairllvm::BasicBlock*,
 llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock ,
 std::allocatorstd::pairllvm::BasicBlock*,
 llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock  
 ::_M_insert_aux(__gnu_cxx::__normal_iteratorstd::pairllvm::BasicBlock*,
 llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock *,
 std::vectorstd::pairllvm::BasicBlock*,
 llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock ,
 std::allocatorstd::pairllvm::BasicBlock*,
 llvm::SuccIteratorllvm::TerminatorInst*, llvm::BasicBlock,
 std::pairllvm::BasicBlock*, llvm::SuccIteratorllvm::TerminatorInst*,
 llvm::BasicBlock  const) + 6988
 11 libdyld.dylib 0x7fff8959c7e1 start + 0
 12 libdyld.dylib 0x0006 start + 1990604837
 Stack dump:
 0. Program arguments: opt
 /var/folders/h5/3mmbxydn5qs3w9f3j6mgmhscgn/T/ghc11789_0/ghc11789_0.ll
 -o
 /var/folders/h5/3mmbxydn5qs3w9f3j6mgmhscgn/T/ghc11789_0/ghc11789_0.bc
 -O1 --enable-tbaa=true
 llc:
 /var/folders/h5/3mmbxydn5qs3w9f3j6mgmhscgn/T/ghc11789_0/ghc11789_0.bc:
 error: Could not open input file: No such file or directory
 Failed to install data-default-class-0.0.1
 cabal: Error: some packages failed to install:
 data-default-class-0.0.1 failed during the building phase. The exception
 was:
 ExitFailure 1


___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Haddock multiple definitions

2013-08-15 Thread Roman Cheplyaka
In any case, it shouldn't fail with a parse error, since this is valid
Haskell.

Please file a ticket at http://trac.haskell.org/haddock (but first see
if it hasn't been reported before).

Roman

* jabolo...@google.com jabolo...@google.com [2013-08-15 15:24:23-0400]
 Hi,
 
 I am using
 
   GHC: 6.12.1
   Haddock: 2.6.0
 
 and the following does not work with Haddock (GHC is fine!):
 
   -- Main
 
   -- | Blah blah blah
   (x, y, z) = (1, 2, 3)
 
 $ haddock ...
 /tmp/Main.hs:2:0: parse error on input `('
 
 
 Is this a bug? Or it's just not part of Haddock?
 
 
 This seems like an interesting feature to document several definitions
 together, for example, error codes:
 
 -- | Syscall error codes for blah...
 --
 -- errA when blah
 -- ...
 (errA, errB, errC) = ...
 
 Cheers,
 Jose
 
 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] Haddock multiple definitions

2013-08-15 Thread jabolopes
Hi,

I cannot find a similar ticket, so it seems that no one has filed this
issue before.  As a general comment, I think this issue is a good
example that perhaps docstrings should go in the AST.

In any case, I would ask someone with a trac account in Haddock to
submit this ticket for me.  I apologize for the inconvenience, but,
for privacy concerns, I don't want an account in Haddock trac and it
does not seem possible to submit a ticket without first creating one.

Thanks,
Jose

On Fri, Aug 16, 2013 at 12:51:35AM +0300, Roman Cheplyaka wrote:
 In any case, it shouldn't fail with a parse error, since this is valid
 Haskell.
 
 Please file a ticket at http://trac.haskell.org/haddock (but first see
 if it hasn't been reported before).
 
 Roman
 
 * jabolo...@google.com jabolo...@google.com [2013-08-15 15:24:23-0400]
  Hi,
  
  I am using
  
GHC: 6.12.1
Haddock: 2.6.0
  
  and the following does not work with Haddock (GHC is fine!):
  
-- Main
  
-- | Blah blah blah
(x, y, z) = (1, 2, 3)
  
  $ haddock ...
  /tmp/Main.hs:2:0: parse error on input `('
  
  
  Is this a bug? Or it's just not part of Haddock?
  
  
  This seems like an interesting feature to document several definitions
  together, for example, error codes:
  
  -- | Syscall error codes for blah...
  --
  -- errA when blah
  -- ...
  (errA, errB, errC) = ...
  
  Cheers,
  Jose
  
  ___
  Haskell-Cafe mailing list
  Haskell-Cafe@haskell.org
  http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] One-element tuple

2013-08-15 Thread AntC
There's an annoying inconsistency:

(CustId 47, CustName Fred, Gender Male)  -- threeple
(CustId 47, CustName Fred)-- twople
--  (CustId 47)-- oneple not!
() -- nople

(That is, it's annoying if you're trying to make typeclass instances for 
extensible/contractable tuples. Yes, I know I could use HLists.)

I'm not happy with either approach I've tried:

data Oneple a = Oneple a   -- (or newtype)
(Oneple $ CustId 47)   -- too verbose

type Oneple a = [a]
[CustId 47]  -- at least looks bracket-y

What do you do?

AntC



___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] One-element tuple

2013-08-15 Thread Ivan Lazar Miljenovic
On 16 August 2013 11:35, AntC anthony_clay...@clear.net.nz wrote:
 There's an annoying inconsistency:

 (CustId 47, CustName Fred, Gender Male)  -- threeple
 (CustId 47, CustName Fred)-- twople
 --  (CustId 47)-- oneple not!
 () -- nople

 (That is, it's annoying if you're trying to make typeclass instances for
 extensible/contractable tuples. Yes, I know I could use HLists.)

 I'm not happy with either approach I've tried:

 data Oneple a = Oneple a   -- (or newtype)
 (Oneple $ CustId 47)   -- too verbose

 type Oneple a = [a]
 [CustId 47]  -- at least looks bracket-y

 What do you do?

http://hackage.haskell.org/package/OneTuple :p

If you really wanted some form of parentheses you could possibly use
quasiquoting for it...


 AntC



 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe



-- 
Ivan Lazar Miljenovic
ivan.miljeno...@gmail.com
http://IvanMiljenovic.wordpress.com

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


Re: [Haskell-cafe] One-element tuple

2013-08-15 Thread Dan Burton
For the consistency you want, `data Oneple a = T a` is the best you can
do in Haskell.

T(CustId 47) is just one character off from what you actually want to
write: (Cust 47). And I presume you want the extra bottom that comes with
this, as opposed to just treating values as their own one-tuples.

I imagine you could write some fancy hack that uses the type system to
automatically promote values to Oneples of the given value when an
expected: Oneple Foo, actual: Foo error occurs. But this would not be
very useful in general.

An uglier option:

type Oneple a = (a, ())


-- Dan Burton


On Thu, Aug 15, 2013 at 7:05 PM, Ivan Lazar Miljenovic 
ivan.miljeno...@gmail.com wrote:

 On 16 August 2013 11:35, AntC anthony_clay...@clear.net.nz wrote:
  There's an annoying inconsistency:
 
  (CustId 47, CustName Fred, Gender Male)  -- threeple
  (CustId 47, CustName Fred)-- twople
  --  (CustId 47)-- oneple not!
  () -- nople
 
  (That is, it's annoying if you're trying to make typeclass instances for
  extensible/contractable tuples. Yes, I know I could use HLists.)
 
  I'm not happy with either approach I've tried:
 
  data Oneple a = Oneple a   -- (or newtype)
  (Oneple $ CustId 47)   -- too verbose
 
  type Oneple a = [a]
  [CustId 47]  -- at least looks bracket-y
 
  What do you do?

 http://hackage.haskell.org/package/OneTuple :p

 If you really wanted some form of parentheses you could possibly use
 quasiquoting for it...

 
  AntC
 
 
 
  ___
  Haskell-Cafe mailing list
  Haskell-Cafe@haskell.org
  http://www.haskell.org/mailman/listinfo/haskell-cafe



 --
 Ivan Lazar Miljenovic
 ivan.miljeno...@gmail.com
 http://IvanMiljenovic.wordpress.com

 ___
 Haskell-Cafe mailing list
 Haskell-Cafe@haskell.org
 http://www.haskell.org/mailman/listinfo/haskell-cafe

___
Haskell-Cafe mailing list
Haskell-Cafe@haskell.org
http://www.haskell.org/mailman/listinfo/haskell-cafe


[Haskell-cafe] Cabal errors...

2013-08-15 Thread Gregory Guthrie
I am trying to run ecliseFP to use with Haskell, but it gives an error:

SO I tried to rebuild the buildwrapper rogram to get the update, but it fails 
as below. Any hints or help on what to do next?

I think that from some past problems, that theshadowed problem is from global 
and usr-local library clashes, but I have never done anything fancy, I always 
just use cabal install xxx for any packages, so had hoped/assumed that it 
would keep everything straight.

TIA.

Eclipse startup error:

Trying to upgrade from exlipse 4.2 to 4.3, the eclipseFP plugin gives me these 
errors:
On startup,

The version of helper executable buildwrapper at:
...\users\me\AppData\Roaming\cabal\bin\buildwrapper.exe is 0.71
but at least version version 0.7.2 is required.

Choose Install to download and install from hackage,
or Cancel to set it up manually in the Haskell preferences page.


--


Then, it tries to do the update, and fails:
Resolving dependencies...
In order, the following would be installed:
List-0.5.1 (new package)
base64-bytestring-1.0.0.1 (new package)
bktrees-0.3.1 (new package)
blaze-builder-0.3.1.1 (new package)
blaze-markup-0.5.1.5 (new package)
blaze-html-0.5.1.3 (new package)
colour-2.3.3 (new package)
cpphs-1.16 (new package)
data-default-class-0.0.1 (new package)
data-default-instances-base-0.0.1 (new package)
data-default-instances-containers-0.0.1 (new package)
data-default-instances-old-locale-0.0.1 (new package)
digest-0.0.1.2 (new package)
dlist-0.5 (new package)
data-default-instances-dlist-0.0.1 (new package)
data-default-0.5.3 (new package)
extensible-exceptions-0.1.1.4 (reinstall) changes: base-4.5.1.0 - 4.6.0.1
haskell-src-exts-1.13.5 (new package)
multiset-0.2.2 (new package)
polyparse-1.8 (new package)
regex-pcre-builtin-0.94.4.7.8.31 (new package)
highlighting-kate-0.5.5 (new package)
syb-0.3.7 (reinstall) changes: base-4.5.1.0 - 4.6.0.1
hs-bibutils-5.0 (new package)
json-0.7 (new package)
pandoc-types-1.10 (new package)
tagsoup-0.12.8 (new package)
temporary-1.1.2.4 (new package)
utf8-string-0.3.7 -bytestring-in-base (new package)
hexpat-0.20.3 (new package)
citeproc-hs-0.3.8 (new package)
wl-pprint-text-1.1.0.0 (new package)
graphviz-2999.16.0.0 (new package)
xml-1.3.13 (new package)
texmath-0.6.3 (new package)
zip-archive-0.1.3.4 (new package)
pandoc-1.10.1 (new package)
Graphalyze-0.14.0.1 (new package)
SourceGraph-0.7.0.5 (new package)
cabal.exe: The following packages are likely to be broken by the reinstalls:
cgi-3001.1.7.4
haskell-platform-2012.4.0.0
haskell-src-1.0.1.5
Use --force-reinstalls if you want to install anyway.


C:\Users\guthriecabal install buildwrapper
Resolving dependencies...
Configuring aeson-0.6.1.0...
Warning: This package indirectly depends on multiple versions of the same
package. This is highly likely to cause a compile failure.
package deepseq-1.3.0.0 requires array-0.4.0.0
package text-0.11.3.1 requires array-0.4.0.1
package deepseq-1.3.0.1 requires array-0.4.0.1
package containers-0.5.0.0 requires array-0.4.0.1
package attoparsec-0.10.4.0 requires array-0.4.0.1
package vector-0.10.0.1 requires base-4.5.1.0
package transformers-0.3.0.0 requires base-4.5.1.0
package primitive-0.5.0.1 requires base-4.5.1.0
package mtl-2.1.2 requires base-4.5.1.0
package deepseq-1.3.0.0 requires base-4.5.1.0
package array-0.4.0.0 requires base-4.5.1.0
package unordered-containers-0.2.3.0 requires base-4.6.0.1
package time-1.4.0.1 requires base-4.6.0.1
package text-0.11.3.1 requires base-4.6.0.1
package template-haskell-2.8.0.0 requires base-4.6.0.1
package syb-0.4.0 requires base-4.6.0.1
package pretty-1.1.1.0 requires base-4.6.0.1
package old-locale-1.0.0.5 requires base-4.6.0.1
package hashable-1.1.2.5 requires base-4.6.0.1
package dlist-0.5 requires base-4.6.0.1
package deepseq-1.3.0.1 requires base-4.6.0.1
package containers-0.5.0.0 requires base-4.6.0.1
package bytestring-0.10.0.2 requires base-4.6.0.1
package blaze-builder-0.3.1.1 requires base-4.6.0.1
package attoparsec-0.10.4.0 requires base-4.6.0.1
package array-0.4.0.1 requires base-4.6.0.1
package aeson-0.6.1.0 requires base-4.6.0.1
package Win32-2.3.0.0 requires base-4.6.0.1
package vector-0.10.0.1 requires deepseq-1.3.0.0
package unordered-containers-0.2.3.0 requires deepseq-1.3.0.1
package time-1.4.0.1 requires deepseq-1.3.0.1
package text-0.11.3.1 requires deepseq-1.3.0.1
package containers-0.5.0.0 requires deepseq-1.3.0.1
package bytestring-0.10.0.2 requires deepseq-1.3.0.1
package attoparsec-0.10.4.0 requires deepseq-1.3.0.1
package aeson-0.6.1.0 requires deepseq-1.3.0.1
package vector-0.10.0.1 requires ghc-prim-0.2.0.0
package primitive-0.5.0.1 requires ghc-prim-0.2.0.0
package integer-gmp-0.4.0.0 requires ghc-prim-0.2.0.0
package base-4.5.1.0 requires ghc-prim-0.2.0.0
package text-0.11.3.1 requires ghc-prim-0.3.0.0
package integer-gmp-0.5.0.0 requires ghc-prim-0.3.0.0