Re: [GHC] #5428: Creating executable in OS X Lion

2011-09-18 Thread GHC
#5428: Creating executable in OS X Lion
+---
Reporter:  sweirich |Owner: 
  
Type:  bug  |   Status:  infoneeded 
  
Priority:  normal   |Milestone: 
  
   Component:  Compiler |  Version:  7.0.3  
  
Keywords:  linking main executable  | Testcase: 
  
   Blockedby:   |   Difficulty: 
  
  Os:  MacOS X  | Blocking: 
  
Architecture:  x86_64 (amd64)   |  Failure:  GHC rejects valid 
program
+---

Comment(by mcandre):

 The same thing happens for me in Lion with Xcode 4.1 and no intermediate
 files.

-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5382: strip: Cannot manipulate object-file created with ghc-7.2.0.20110728 under solaris

2011-09-18 Thread GHC
#5382: strip: Cannot manipulate object-file created with ghc-7.2.0.20110728 
under
solaris
---+
  Reporter:  maeder|  Owner:  simonmar
  Type:  bug   | Status:  closed  
  Priority:  normal|  Milestone:  7.4.1   
 Component:  Compiler  |Version:  7.1 
Resolution:  fixed |   Keywords:  
  Testcase:|  Blockedby:  
Difficulty:| Os:  Solaris 
  Blocking:|   Architecture:  x86 
   Failure:  None/Unknown  |  
---+
Changes (by herzen):

 * cc: viskovatoff@… (added)


Comment:

 Disabling stripping on Solaris seems like a drastic solution, given that
 GNU strip is found in a standard location under Solaris 11,
 /usr/gnu/bin/strip.

 The problem goes away for me when I remove the Sun strip that's in
 /usr/bin, so that Gnu strip gets used.

 Unfortunately, users cannot solve this problem by placing /usr/gnu/bin in
 front of /usr/bin in their PATH, since GNU ld also resides in
 /usr/gnu/bin, and I don't think we want that to get used.

 GNU strip is in the gnu-binutils package, which anyone using Haskell would
 probably have installed.

-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #989: Windows "native" port

2011-09-18 Thread GHC
#989: Windows "native" port
-+--
Reporter:  simonmar  |Owner:  
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  _|_ 
   Component:  Compiler  |  Version:  
Keywords:| Testcase:  N/A 
   Blockedby:|   Difficulty:  Difficult (2-5 days)
  Os:  Windows   | Blocking:  
Architecture:  x86   |  Failure:  None/Unknown
-+--

Comment(by simonmar):

 @dagit: using the MS compiler chain by itself wouldn't give us a 64-bit
 Windows port, though it would mean that we don't depend on a working
 64-bit mingw port. See #1884.

-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #5491: build GHC binaries against GMP 5

2011-09-18 Thread GHC
#5491: build GHC binaries against GMP 5
---+
  Reporter:  parcs |  Owner:  
  Type:  task  | Status:  closed  
  Priority:  normal|  Milestone:  
 Component:  Build System  |Version:  7.2.1   
Resolution:  wontfix   |   Keywords:  
  Testcase:|  Blockedby:  
Difficulty:| Os:  Unknown/Multiple
  Blocking:|   Architecture:  Unknown/Multiple
   Failure:  None/Unknown  |  
---+
Changes (by igloo):

  * status:  new => closed
  * resolution:  => wontfix


Comment:

 The Linux builds are done on a Debian/stable machine, and Debian stable
 has GMP 4. It's inevitable that binary builds will only work on some
 machines, but we are happy to put up alternative builds from other people
 on the download page.

 Alternatively, your distribution will probably provide a working ghc
 package.

-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #989: Windows "native" port

2011-09-18 Thread GHC
#989: Windows "native" port
-+--
Reporter:  simonmar  |Owner:  
Type:  task  |   Status:  new 
Priority:  normal|Milestone:  _|_ 
   Component:  Compiler  |  Version:  
Keywords:| Testcase:  N/A 
   Blockedby:|   Difficulty:  Difficult (2-5 days)
  Os:  Windows   | Blocking:  
Architecture:  x86   |  Failure:  None/Unknown
-+--
Changes (by dagit):

 * cc: dagitj@… (added)


Comment:

 Being able to use MS compiler tool chain would be useful to me in the
 following two ways:

   * 64bit Haskell binaries (yay, 8gigs of ram!)
   * Directly use foo.lib files instead of using gendef/dlltool to
 (hopefully) construct a .a file.  This comes up when trying to use OpenCL
 with Haskell on windows.

-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs


Re: [GHC] #3645: Layout and pragmas

2011-09-18 Thread GHC
#3645: Layout and pragmas
+---
  Reporter:  igloo  |  Owner:  
  Type:  feature request| Status:  new 
  Priority:  normal |  Milestone:  7.4.1   
 Component:  Compiler (Parser)  |Version:  6.10.4  
Resolution: |   Keywords:  
  Testcase: |  Blockedby:  
Difficulty:  Unknown| Os:  Unknown/Multiple
  Blocking: |   Architecture:  Unknown/Multiple
   Failure:  None/Unknown   |  
+---
Changes (by igloo):

  * milestone:  7.2.1 => 7.4.1


Comment:

 One possibility is something along these lines:
 {{{
 diff --git a/compiler/main/HeaderInfo.hs b/compiler/main/HeaderInfo.hs
 index a3f7e79..738f4f8 100644
 --- a/compiler/main/HeaderInfo.hs
 +++ b/compiler/main/HeaderInfo.hs
 @@ -39,6 +39,7 @@ import Exception
  import Control.Monad
  import System.IO
  import System.IO.Unsafe
 +import Data.Char
  import Data.List

 --
 @@ -227,24 +228,31 @@ getOptions' toks
| ITdocOptionsOld str <- getToken open
= map (L (getLoc open)) ["-haddock-opts", removeSpaces str]
  ++ parseToks xs
 -  parseToks (open:xs)
 -  | ITlanguage_prag <- getToken open
 -  = parseLanguage xs
 +  parseToks (open:close:xs)
 +  | ITlanguage_prag str <- getToken open
 +  , ITclose_prag <- getToken close
 +  = parseLanguage (getLoc open) str
 +++ parseToks xs
parseToks (x:xs)
| ITdocCommentNext _ <- getToken x
= parseToks xs
parseToks _ = []
 -  parseLanguage (L loc (ITconid fs):rest)
 -  = checkExtension (L loc fs) :
 -case rest of
 -  (L _loc ITcomma):more -> parseLanguage more
 -  (L _loc ITclose_prag):more -> parseToks more
 -  (L loc _):_ -> languagePragParseError loc
 -  [] -> panic "getOptions'.parseLanguage(1) went past eof
 token
 -  parseLanguage (tok:_)
 -  = languagePragParseError (getLoc tok)
 -  parseLanguage []
 -  = panic "getOptions'.parseLanguage(2) went past eof token"
 +
 +  parseLanguage loc str
 +  = map (checkExtension loc) $ splits (dropWhile isSpace str)
 +  where isSepChar c = isSpace c || c == ','
 +splits [] = languagePragParseError loc
 +splits (',' : _) = languagePragParseError loc
 +splits xs0 = case break isSepChar xs0 of
 + (extension, xs1) ->
 + extension
 +   : (case dropWhile isSpace xs1 of
 +  ',' : xs2 ->
 +  splits (dropWhile isSpace xs2)
 +  [] ->
 +  []
 +  _ ->
 +  languagePragParseError loc)

 -

 @@ -263,14 +271,13 @@ checkProcessArgsResult flags

 -

 -checkExtension :: Located FastString -> Located String
 -checkExtension (L l ext)
 +checkExtension :: SrcSpan -> String -> Located String
 +checkExtension l ext
  -- Checks if a given extension is valid, and if so returns
  -- its corresponding flag. Otherwise it throws an exception.
 - =  let ext' = unpackFS ext in
 -if ext' `elem` supportedLanguagesAndExtensions
 -then L l ("-X"++ext')
 -else unsupportedExtnError l ext'
 + =  if ext `elem` supportedLanguagesAndExtensions
 +then L l ("-X" ++ ext)
 +else unsupportedExtnError l ext

  languagePragParseError :: SrcSpan -> a
  languagePragParseError loc =
 diff --git a/compiler/parser/Lexer.x b/compiler/parser/Lexer.x
 index 90e1e66..754247b 100644
 --- a/compiler/parser/Lexer.x
 +++ b/compiler/parser/Lexer.x
 @@ -480,7 +480,7 @@ data Token
| ITclose_prag
| IToptions_prag String
| ITinclude_prag String
 -  | ITlanguage_prag
 +  | ITlanguage_prag String
| ITvect_prag
| ITvect_scalar_prag
| ITnovect_prag
 @@ -2233,7 +2233,7 @@ linePrags = Map.singleton "line" (begin line_prag2)
  fileHeaderPrags = Map.fromList([("options", lex_string_prag
 IToptions_prag),
   ("options_ghc", lex_string_prag
 IToptions_prag
   ("options_haddock", lex_string_prag
 ITdocOptio
 -   

Re: [GHC] #888: Implement the static argument transformation

2011-09-18 Thread GHC
#888: Implement the static argument transformation
-+--
Reporter:  simonpj   |Owner:  
Type:  task  |   Status:  new 
Priority:  low   |Milestone:  7.2.1   
   Component:  Compiler  |  Version:  6.4.2   
Keywords:| Testcase:  N/A 
   Blockedby:|   Difficulty:  Unknown 
  Os:  Unknown/Multiple  | Blocking:  
Architecture:  Unknown/Multiple  |  Failure:  None/Unknown
-+--
Changes (by jmcarthur):

 * cc: Jake.McArthur@… (added)


-- 
Ticket URL: 
GHC 
The Glasgow Haskell Compiler

___
Glasgow-haskell-bugs mailing list
Glasgow-haskell-bugs@haskell.org
http://www.haskell.org/mailman/listinfo/glasgow-haskell-bugs